Skip to content

Commit

Permalink
install digest when looking at pkg deps
Browse files Browse the repository at this point in the history
  • Loading branch information
schloerke committed Nov 15, 2022
1 parent 74f0dad commit 1e30e3d
Showing 1 changed file with 8 additions and 0 deletions.
8 changes: 8 additions & 0 deletions setup-macOS-dependencies/action.yaml
Original file line number Diff line number Diff line change
Expand Up @@ -24,6 +24,14 @@ runs:
options(pak.no_extra_messages = TRUE)
install.packages("pak", repos = sprintf("https://r-lib.github.io/p/pak/stable/%s/%s/%s", .Platform$pkgType, R.Version()$os, R.Version()$arch))
}
if (any(
grepl("url::", "${{ inputs.extra-packages }}", fixed = TRUE),
file.exists("DESCRIPTION") &&
any(grepl("url::", readLines("DESCRIPTION"), fixed = TRUE))
)) {
# Need for url remotes. See https://github.com/r-lib/actions/issues/562#issuecomment-1129088041
install.packages("digest", repos = "http://cran.us.r-project.org")
}
split_pkg_str <- function(txt) {
strsplit(txt, "[[:space:],]+")[[1]]
}
Expand Down

0 comments on commit 1e30e3d

Please sign in to comment.