Skip to content

Commit

Permalink
Print error of metadata download failure
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Jun 24, 2024
1 parent 698d62b commit 2131d18
Showing 1 changed file with 2 additions and 1 deletion.
3 changes: 2 additions & 1 deletion R/metadata-cache.R
Original file line number Diff line number Diff line change
Expand Up @@ -779,9 +779,10 @@ missing_pkgs_note <- function(pkgs, result) {

what <- vcapply(msgs, "[[", 1)
where <- vcapply(msgs, "[[", 2)
errmsg <- vcapply(which(bad), function(i) conditionMessage(result[[i]]))
for (wt in unique(what)) {
wh <- unique(where[what == wt])
cli::cli_alert_info("{wt} packages are missing from {wh}")
cli::cli_alert_info("{wt} packages are missing from {wh}: {errmsg}")
}
}

Expand Down

0 comments on commit 2131d18

Please sign in to comment.