Skip to content

Commit

Permalink
Fix branch mixup.
Browse files Browse the repository at this point in the history
Accidentally got some changes from another branch.
  • Loading branch information
gaborcsardi committed Sep 9, 2021
1 parent 5782a7a commit 1d0870b
Showing 1 changed file with 1 addition and 11 deletions.
12 changes: 1 addition & 11 deletions R/build.R
Original file line number Diff line number Diff line change
Expand Up @@ -12,20 +12,10 @@ build_package <- function(path, tmpdir, build_args, libpath, quiet) {

if (file.info(path)$isdir) {
if (!quiet) cat_head("R CMD build")

desc <- desc(path)
clean_doc <- as_flag(desc$get("Config/build/clean-inst-doc"), NULL)

with_envvar(
c("R_LIBS_USER" = paste(libpath, collapse = .Platform$path.sep)), {
proc <- pkgbuild_process$new(
path,
tmpdir,
args = build_args,
clean_doc = clean_doc
)
proc <- pkgbuild_process$new(path, tmpdir, args = build_args)
on.exit(proc$kill(), add = TRUE)

callback <- detect_callback()
while (proc$is_incomplete_output() || proc$is_incomplete_error()) {
proc$poll_io(-1)
Expand Down

0 comments on commit 1d0870b

Please sign in to comment.