Skip to content

Commit

Permalink
0.9.2 prep (#724)
Browse files Browse the repository at this point in the history
* URL update prior to using usethis::use_github_links()

* revdep results / ignore

* using usethis::use_release_issue

* rename all.name to avoid note about S3 method registration

* initial cran-comments.md

* update build ignore for release-workflow files

* test name typo

* ignore stale packages (packrat) for snapshot in test

devtools::check(remote = TRUE, manual = TRUE)

these tests do not run in CI/CRAN and were only local problems.

* final comment updates
  • Loading branch information
aronatkins authored Sep 1, 2023
1 parent 0757b1e commit 74ad19f
Show file tree
Hide file tree
Showing 12 changed files with 58 additions and 15 deletions.
3 changes: 3 additions & 0 deletions .Rbuildignore
Original file line number Diff line number Diff line change
Expand Up @@ -12,6 +12,9 @@
^\.lintr$
^tags$
^R/tags$
^cran-comments\.md$
^revdep$
^CRAN-SUBMISSION$
^tests/testthat/packrat/lib$
^tests/testthat/packrat/lib-R$
^tests/testthat/packrat/lib-ext$
Expand Down
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,7 @@ Authors@R: c(
Description: Manage the R packages your project depends on in an isolated,
portable, and reproducible way.
License: GPL-2
URL: https://github.com/rstudio/packrat/
URL: https://github.com/rstudio/packrat
BugReports: https://github.com/rstudio/packrat/issues
Depends:
R (>= 3.0.0)
Expand Down
4 changes: 2 additions & 2 deletions R/install.R
Original file line number Diff line number Diff line change
Expand Up @@ -677,7 +677,7 @@ wrap_command <- function(x) {
# `with_envvar` uses this function to temporarily replace environment variables
# for execution of a code block.
set_envvar <- function(envs, action = "replace") {
stopifnot(all.named(envs))
stopifnot(all_named(envs))
stopifnot(is.character(action), length(action) == 1)
action <- match.arg(action, c("replace", "prefix", "suffix"))

Expand All @@ -699,7 +699,7 @@ set_envvar <- function(envs, action = "replace") {
invisible(old)
}

all.named <- function(x) {
all_named <- function(x) {
!is.null(names(x)) && all(names(x) != "")
}

Expand Down
2 changes: 2 additions & 0 deletions RELEASE.md
Original file line number Diff line number Diff line change
@@ -1,5 +1,7 @@
## Release Instructions

> Try to use `usethis::use_release_issue()` rather than this checklist.
Create an issue with the following content, replacing `${RELEASE_VERSION}` and
`${NEXT_RELEASE_VERSION}` with the current and next release versions.

Expand Down
16 changes: 16 additions & 0 deletions cran-comments.md
Original file line number Diff line number Diff line change
@@ -0,0 +1,16 @@
## Summary

* correct package docs for roxygen2 change.
* addresses minor issues seen by users.

## R CMD check results

0 errors ✔ | 0 warnings ✔ | 0 notes ✔

## revdepcheck results

We checked 5 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package.

* We saw 0 new problems
* We failed to check 0 packages

2 changes: 1 addition & 1 deletion man/packrat-package.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

7 changes: 7 additions & 0 deletions revdep/.gitignore
Original file line number Diff line number Diff line change
@@ -0,0 +1,7 @@
checks
library
checks.noindex
library.noindex
cloud.noindex
data.sqlite
*.html
2 changes: 2 additions & 0 deletions revdep/README.md
Original file line number Diff line number Diff line change
@@ -0,0 +1,2 @@
# Revdeps

7 changes: 7 additions & 0 deletions revdep/cran.md
Original file line number Diff line number Diff line change
@@ -0,0 +1,7 @@
## revdepcheck results

We checked 5 reverse dependencies, comparing R CMD check results across CRAN and dev versions of this package.

* We saw 0 new problems
* We failed to check 0 packages

1 change: 1 addition & 0 deletions revdep/failures.md
Original file line number Diff line number Diff line change
@@ -0,0 +1 @@
*Wow, no problems at all. :)*
1 change: 1 addition & 0 deletions revdep/problems.md
Original file line number Diff line number Diff line change
@@ -0,0 +1 @@
*Wow, no problems at all. :)*
26 changes: 15 additions & 11 deletions tests/testthat/test-packrat.R
Original file line number Diff line number Diff line change
Expand Up @@ -85,15 +85,17 @@ withTestContext({
# Snapshot the new state and make sure we picked up both toast and its
# dependency, bread
pkgs <- pkgNames(lockInfo(projRoot))
expect_false("bread" %in% pkgs)
expect_false("toast" %in% pkgs)
snapshot(projRoot)
msg <- paste0("pkgs: ", pkgs, collapse = ", ")
expect_false("bread" %in% pkgs, msg)
expect_false("toast" %in% pkgs, msg)
snapshot(projRoot, ignore.stale = TRUE)
pkgs <- pkgNames(lockInfo(projRoot))
expect_true("bread" %in% pkgs)
expect_true("toast" %in% pkgs)
msg <- paste0("pkgs: ", pkgs, collapse = ", ")
expect_true("bread" %in% pkgs, msg)
expect_true("toast" %in% pkgs, msg)
})

test_that("snapshot captures only installed dependecies butwhen infer.dependencies is FALSE", {
test_that("snapshot captures only installed dependecies when infer.dependencies is FALSE", {
skip_on_cran()
skip_on_travis()
skip_on_ci()
Expand All @@ -111,12 +113,14 @@ withTestContext({
# Snapshot the new state and make sure we picked up both toast and its
# dependency, bread
pkgs <- pkgNames(lockInfo(projRoot))
expect_false("bread" %in% pkgs)
expect_false("toast" %in% pkgs)
snapshot(projRoot, infer.dependencies = FALSE)
msg <- paste0("pkgs: ", pkgs, collapse = ", ")
expect_false("bread" %in% pkgs, msg)
expect_false("toast" %in% pkgs, msg)
snapshot(projRoot, infer.dependencies = FALSE, ignore.stale = TRUE)
pkgs <- pkgNames(lockInfo(projRoot))
expect_true("bread" %in% pkgs)
expect_false("toast" %in% pkgs)
msg <- paste0("pkgs: ", pkgs, collapse = ", ")
expect_true("bread" %in% pkgs, msg)
expect_false("toast" %in% pkgs, msg)
})

test_that("dependencies in library directories are ignored", {
Expand Down

0 comments on commit 74ad19f

Please sign in to comment.