Skip to content

Commit

Permalink
Fix bug in bundlePackages()
Browse files Browse the repository at this point in the history
Introduced in #670.
  • Loading branch information
hadley committed Feb 27, 2023
1 parent d8fef5d commit c9939b9
Showing 1 changed file with 3 additions and 1 deletion.
4 changes: 3 additions & 1 deletion R/bundlePackage.R
Original file line number Diff line number Diff line change
Expand Up @@ -38,7 +38,9 @@ bundlePackages <- function(appDir,
github_cols <- grep("Github", colnames(deps), perl = TRUE, value = TRUE)
packages <- deps[c("Source", "Repository", github_cols, "description")]
packages_list <- lapply(seq_len(nrow(packages)), function(i) {
as.list(packages[i, , drop = FALSE])
out <- as.list(packages[i, , drop = FALSE])
out$description <- out$description[[1]]
out
})
names(packages_list) <- deps$Package
packages_list
Expand Down

0 comments on commit c9939b9

Please sign in to comment.