Skip to content

Commit

Permalink
Handle R 3.6
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley committed Jul 15, 2024
1 parent f471779 commit 117317c
Showing 1 changed file with 2 additions and 0 deletions.
2 changes: 2 additions & 0 deletions R/parse_all.R
Original file line number Diff line number Diff line change
Expand Up @@ -128,6 +128,8 @@ parse_all.character <- function(x, filename = NULL, allow_error = FALSE) {
# Restore newlines stripped while converting to vector of lines
if (length(res$src)) {
res$src <- paste0(res$src, "\n")
} else {
res$src <- character()
}

res$expr <- lapply(res$expr, removeSource)
Expand Down

0 comments on commit 117317c

Please sign in to comment.