diff --git a/NEWS.md b/NEWS.md index b4ed92e61..c176ab07b 100644 --- a/NEWS.md +++ b/NEWS.md @@ -87,6 +87,8 @@ you should switch your package to depend on **usethis** directly instead. ## Bugfixes and additional changes +* `check_win_*()` now build the package with `manual = TRUE` by default (#1890). + * `check()` output now works more nicely with recent changes to rcmdcheck (#1874). * `reload()` now reloads loaded but not attached packages as well as attached ones. diff --git a/R/check-win.R b/R/check-win.R index a0316c7d1..7750ab20c 100644 --- a/R/check-win.R +++ b/R/check-win.R @@ -25,24 +25,33 @@ build_win <- function(pkg = ".", version = c("R-devel", "R-release")) { #' @describeIn check_win Check package on the development version of R. #' @export -check_win_devel <- function(pkg = ".", args = NULL, quiet = FALSE, ...) { - check_win(pkg = pkg, version = "R-devel", args = args, quiet = quiet, ...) +check_win_devel <- function(pkg = ".", args = NULL, manual = TRUE, quiet = FALSE, ...) { + check_win( + pkg = pkg, version = "R-devel", args = args, manual = manual, + quiet = quiet, ... + ) } #' @describeIn check_win Check package on the release version of R. #' @export -check_win_release <- function(pkg = ".", args = NULL, quiet = FALSE, ...) { - check_win(pkg = pkg, version = "R-release", args = args, quiet = quiet, ...) +check_win_release <- function(pkg = ".", args = NULL, manual = TRUE, quiet = FALSE, ...) { + check_win( + pkg = pkg, version = "R-release", args = args, manual = manual, + quiet = quiet, ... + ) } #' @describeIn check_win Check package on the previous major release version of R. #' @export -check_win_oldrelease <- function(pkg = ".", args = NULL, quiet = FALSE, ...) { - check_win(pkg = pkg, version = "R-oldrelease", args = args, quiet = quiet, ...) +check_win_oldrelease <- function(pkg = ".", args = NULL, manual = TRUE, quiet = FALSE, ...) { + check_win( + pkg = pkg, version = "R-oldrelease", args = args, manual = manual, + quiet = quiet, ... + ) } check_win <- function(pkg = ".", version = c("R-devel", "R-release", "R-oldrelease"), - args = NULL, quiet = FALSE, ...) { + args = NULL, manual = TRUE, quiet = FALSE, ...) { pkg <- as.package(pkg) version <- match.arg(version, several.ok = TRUE) @@ -57,7 +66,10 @@ check_win <- function(pkg = ".", version = c("R-devel", "R-release", "R-oldrelea } } - built_path <- pkgbuild::build(pkg$path, tempdir(), args = args, quiet = quiet, ...) + built_path <- pkgbuild::build(pkg$path, tempdir(), + args = args, + manual = manual, quiet = quiet, ... + ) on.exit(unlink(built_path)) url <- paste0(