Skip to content

Commit

Permalink
Build manual as needed
Browse files Browse the repository at this point in the history
By passing `manual = FALSE` to pkgbuild, it will
not add `--no-manual` to the `R CMD build` command
line, so `R CMD build` will decide automatically
if it needs the PDF manual (if the docs have `\Sexpr{}`
expressions) or not.

Closes #137.
  • Loading branch information
gaborcsardi committed Sep 9, 2021
1 parent 2702086 commit 739c2d7
Showing 1 changed file with 6 additions and 1 deletion.
7 changes: 6 additions & 1 deletion R/build.R
Original file line number Diff line number Diff line change
Expand Up @@ -12,7 +12,12 @@ build_package <- function(path, tmpdir, build_args, libpath, quiet) {
if (!quiet) cat_head("R CMD build")
with_envvar(
c("R_LIBS_USER" = paste(libpath, collapse = .Platform$path.sep)), {
proc <- pkgbuild_process$new(path, tmpdir, args = build_args)
proc <- pkgbuild_process$new(
path,
tmpdir,
args = build_args,
manual = TRUE
)
on.exit(proc$kill(), add = TRUE)
callback <- detect_callback()
while (proc$is_incomplete_output() ||
Expand Down

0 comments on commit 739c2d7

Please sign in to comment.