@@ -283,8 +283,10 @@ updateRepositories <- function(repo_dir, manifest, update_all = FALSE) {
283
283
} else {
284
284
extra <- ifelse(length(pkgs ) > 10 , paste(" +" , length(pkgs ) - 10 , " more" ), " " )
285
285
printMessage(paste(" Updating:" , paste(c(head(pkgs , 10 ), extra ), collapse = " , " )), 2 )
286
- for (pkg in pkgs ) {
287
- printMessage(paste0(" Package: " , pkg ), 0 )
286
+ skipped_pkgs <- NULL
287
+ for (i in seq_along(pkgs )) {
288
+ pkg <- pkgs [i ]
289
+ printMessage(sprintf(" Package: %s (%i of %i)" , pkg , i , length(pkgs )), 0 )
288
290
repo <- file.path(repo_dir , pkg )
289
291
290
292
if (! dir.exists(repo )) {
@@ -296,7 +298,7 @@ updateRepositories <- function(repo_dir, manifest, update_all = FALSE) {
296
298
return (TRUE )
297
299
})
298
300
if (isTRUE(skip )) {
299
- pkgs <- setdiff( pkgs , pkg )
301
+ skipped_pkgs <- c( skipped_pkgs , pkg )
300
302
} else {
301
303
checkoutBranches(pkg , repo_dir = repo_dir )
302
304
}
@@ -309,11 +311,12 @@ updateRepositories <- function(repo_dir, manifest, update_all = FALSE) {
309
311
0 , timestamp = TRUE )
310
312
return (TRUE )
311
313
})
312
- if (isTRUE(skip )) { pkgs <- setdiff( pkgs , pkg ) }
314
+ if (isTRUE(skip )) { skipped_pkgs <- c( skipped_pkgs , pkg ) }
313
315
314
316
}
315
317
316
318
}
319
+ pkgs <- setdiff(pkgs , skipped_pkgs )
317
320
printMessage(" Finished updating repositories" , 0 )
318
321
return (pkgs )
319
322
}
0 commit comments