Skip to content

Commit

Permalink
Do not duplicate PATH in install process on Windows
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Apr 23, 2024
1 parent 14c855c commit 34120b0
Showing 1 changed file with 1 addition and 8 deletions.
9 changes: 1 addition & 8 deletions R/install-plan.R
Original file line number Diff line number Diff line change
Expand Up @@ -358,14 +358,7 @@ make_build_process <- function(path, pkg, tmp_dir, lib, vignettes,
if (is_windows()) {
zip_tool_path <- asNamespace("zip")$get_tool("zip")
rtools <- get_rtools_path()
withr_local_path(
paste0(
dirname(zip_tool_path),
.Platform$path.sep,
if (!is.null(rtools)) paste0(rtools, .Platform$path.sep),
Sys.getenv("PATH")
)
)
withr_local_path(c(dirname(zip_tool_path), rtools))
}
# nocov end

Expand Down

0 comments on commit 34120b0

Please sign in to comment.