Skip to content

Commit

Permalink
fix dev switch
Browse files Browse the repository at this point in the history
  • Loading branch information
toph-allen committed Mar 22, 2022
1 parent f0a8a00 commit 052e689
Show file tree
Hide file tree
Showing 2 changed files with 2 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/bundle.R
Original file line number Diff line number Diff line change
Expand Up @@ -425,7 +425,7 @@ writeManifest <- function(appDir = getwd(),
if (is.null(quartoManifestDetails)) {
# If we don't yet have metadata, attempt to use quarto inspect
# TODO: Do we want to even run Quarto Inspect if we don't explicitly have Quarto passed in?
inspect <- quartoInspect(target <- appDir, quarto = whichQuarto(quarto))
inspect <- quartoInspect(target = appDir, quarto = whichQuarto(quarto))
quartoManifestDetails <- getQuartoManifestDetails(inspect = inspect)
}

Expand Down
2 changes: 1 addition & 1 deletion R/deployApp.R
Original file line number Diff line number Diff line change
Expand Up @@ -543,7 +543,7 @@ getQuartoManifestDetails <- function(inspect = list(), metadata = list()) {
# Identify a valid Quarto executable. When a location is not provided,
# attempts to discover Quarto from the PATH and other well-known locations.
whichQuarto <- function(quarto = NULL) {
if (isTRUE(Sys.getenv("RSCONNECT_QUARTO_MUST_BE_EXPLICIT"))) {
if (isTRUE(as.logical(Sys.getenv("RSCONNECT_QUARTO_MUST_BE_EXPLICIT")))) {
if (is.null(quarto)) return(NULL)
}

Expand Down

0 comments on commit 052e689

Please sign in to comment.