Skip to content

Commit

Permalink
check_cran: suppress stdout of each R CMD check process
Browse files Browse the repository at this point in the history
  • Loading branch information
wch committed Dec 12, 2012
1 parent d095e58 commit 2bb6bed
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 4 deletions.
4 changes: 2 additions & 2 deletions R/check-cran.r
Expand Up @@ -112,8 +112,8 @@ check_cran <- function(pkgs, libpath = file.path(tempdir(), "R-lib"),
message("Checking ", i , ": ", pkgs[i])
check_args <- "--no-multiarch --no-manual --no-codoc"
try(check_r_cmd(local, cran = TRUE, check_version = FALSE,
force_suggests = FALSE, args = check_args, check_dir = check_dir),
silent = TRUE)
force_suggests = FALSE, args = check_args, check_dir = check_dir,
stdout = NULL), silent = TRUE)

check_path <- file.path(check_dir, gsub("_.*?$", ".Rcheck", url$name))
results <- parse_check_results(check_path)
Expand Down
4 changes: 2 additions & 2 deletions R/check.r
Expand Up @@ -58,7 +58,7 @@ check <- function(pkg = ".", document = TRUE, cleanup = TRUE, cran = TRUE,
# @param built_path The path to the built .tar.gz source package.
# @param check_dir The directory to unpack the .tar.gz file to
check_r_cmd <- function(built_path = NULL, cran = TRUE, check_version = FALSE,
force_suggests = TRUE, args = NULL, check_dir = tempdir()) {
force_suggests = TRUE, args = NULL, check_dir = tempdir(), ...) {

pkgname <- gsub("_.*?$", "", basename(built_path))

Expand All @@ -76,7 +76,7 @@ check_r_cmd <- function(built_path = NULL, cran = TRUE, check_version = FALSE,
)

R(paste("CMD check ", shQuote(built_path), " ", opts, sep = ""), check_dir,
env_vars)
env_vars, ...)

# Return the path to the check output
file.path(tempdir(), paste(pkgname, ".Rcheck", sep = ""))
Expand Down

0 comments on commit 2bb6bed

Please sign in to comment.