Skip to content

Commit

Permalink
Only install shinycoreci if the libpath is shinycoreci_libpath
Browse files Browse the repository at this point in the history
  • Loading branch information
schloerke committed Mar 15, 2024
1 parent 49c2b03 commit 2e77a06
Showing 1 changed file with 3 additions and 2 deletions.
5 changes: 3 additions & 2 deletions R/install.R
Original file line number Diff line number Diff line change
Expand Up @@ -166,8 +166,9 @@ install_missing_pkgs <- function(
stopifnot(length(list(...)) == 0)

# Make sure to get underlying dependencies
# Always add shiny/shinycoreci as it is always needed
packages <- unique(c(packages, get_extra_shinyverse_deps(c(packages, "shiny", "local::."))))
# Always add shiny as it is always needed
# Only install shinycoreci if the libpath is shinycoreci_libpath()
packages <- unique(c(packages, get_extra_shinyverse_deps(c(packages, "shiny", if (libpath == shinycoreci_libpath()) "shinycoreci" ))))

pkgs_to_install <- packages[!(packages %in% names(installed_pkgs))]

Expand Down

0 comments on commit 2e77a06

Please sign in to comment.