Skip to content

Commit

Permalink
Fix printing stdout on build/install failure
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Apr 2, 2024
1 parent b0b4a01 commit b476a9a
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/subprocess.R
Original file line number Diff line number Diff line change
Expand Up @@ -115,11 +115,11 @@ remote <- function(func, args = list()) {
# This is a temporary workaround until we have a principled way of
# printing the various error types in the main process.
if (inherits(res$error$parent, "package_build_error") &&
!is.null(res$error$parent$data$stdout)) {
!is.null(res$error$parent$stdout)) {
res$error$parent$message <- paste0(
res$error$parent$message,
"\nFull installation output:\n",
paste(res$error$parent$data$stdout, collapse = "\n")
paste(res$error$parent$stdout, collapse = "\n")
)
}
err$throw(res$error)
Expand Down

0 comments on commit b476a9a

Please sign in to comment.