Skip to content

Commit

Permalink
Fix issue when no nightly was installed, but the installed folder exi…
Browse files Browse the repository at this point in the history
…sts.
  • Loading branch information
cderv committed Feb 26, 2024
1 parent ecad641 commit 5d5382f
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/pandoc-install.R
Original file line number Diff line number Diff line change
Expand Up @@ -160,7 +160,7 @@ pandoc_install_nightly <- function(n_last = 1L) {
artifact_url <- keep(artifacts$artifacts, ~ .x$name == bundle_name)[[1]][["archive_download_url"]]
if (fs::dir_exists(install_dir)) {
current_version <- pandoc_nightly_version()
if (head_sha == current_version) {
if (!is.null(current_version) && head_sha == current_version) {
rlang::inform(c(v = paste0("Last version already installed: ", current_version)))
return(invisible(install_dir))
}
Expand Down

0 comments on commit 5d5382f

Please sign in to comment.