Skip to content

Commit d1a3849

Browse files
committed
Don't inherit error_on docs from rcmdcheck
Closes #2506
1 parent aebb4e3 commit d1a3849

File tree

2 files changed

+33
-37
lines changed

2 files changed

+33
-37
lines changed

R/check.R

Lines changed: 18 additions & 15 deletions
Original file line numberDiff line numberDiff line change
@@ -21,23 +21,19 @@
2121
#' Devtools does its best to set up an environment that combines best practices
2222
#' with how check works on CRAN. This includes:
2323
#'
24-
#' \itemize{
24+
#' * The standard environment variables set by devtools:
25+
#' [r_env_vars()]. Of particular note for package tests is the `NOT_CRAN` env
26+
#' var, which lets you know that your tests are running somewhere other than
27+
#' CRAN, and hence can take a reasonable amount of time.
2528
#'
26-
#' \item The standard environment variables set by devtools:
27-
#' [r_env_vars()]. Of particular note for package tests is the
28-
#' `NOT_CRAN` env var which lets you know that your tests are not
29-
#' running on CRAN, and hence can take a reasonable amount of time.
29+
#' * Debugging flags for the compiler, set by
30+
#' [`compiler_flags(FALSE)`][compiler_flags()].
3031
#'
31-
#' \item Debugging flags for the compiler, set by
32-
#' \code{\link{compiler_flags}(FALSE)}.
32+
#' * If `aspell` is found, `_R_CHECK_CRAN_INCOMING_USE_ASPELL_`
33+
#' is set to `TRUE`. If no spell checker is installed, a warning is issued.
3334
#'
34-
#' \item If `aspell` is found `_R_CHECK_CRAN_INCOMING_USE_ASPELL_`
35-
#' is set to `TRUE`. If no spell checker is installed, a warning is
36-
#' issued.)
37-
#'
38-
#' \item env vars set by arguments `incoming`, `remote` and
39-
#' `force_suggests`
40-
#' }
35+
#' * Environment variables, controlled by arguments `incoming`, `remote` and
36+
#' `force_suggests`.
4137
#'
4238
#' @return An object containing errors, warnings, notes, and more.
4339
#' @template devtools
@@ -175,7 +171,14 @@ can_document <- function(pkg) {
175171
#' @param manual If `FALSE`, don't build and check manual (`--no-manual`).
176172
#' @param env_vars Environment variables set during `R CMD check`
177173
#' @param quiet if `TRUE` suppresses output from this function.
178-
#' @inheritParams rcmdcheck::rcmdcheck
174+
#' @param error_on Whether to throw an error on `R CMD check` failures. Note
175+
#' that the check is always completed (unless a timeout happens), and the
176+
#' error is only thrown after completion.
177+
#'
178+
#' `error_on` is passed through to [rcmdcheck::rcmdcheck()], which is the
179+
#' definitive source for what the different values mean. If not specified by
180+
#' the user, both `check()` and `check_built()` default to `error_on =
181+
#' "never"` in interactive use and `"warning"` in a non-interactive setting.
179182
check_built <- function(path = NULL, cran = TRUE,
180183
remote = FALSE, incoming = remote, force_suggests = FALSE,
181184
run_dont_test = FALSE, manual = FALSE, args = "--timings",

man/check.Rd

Lines changed: 15 additions & 22 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)