@@ -7,6 +7,7 @@ library(glue)
7
7
if (! file.exists(" revdep-repos" )) {
8
8
stop(" Please run .dev/revdep_get_repos.R first before running this" )
9
9
}
10
+ withr :: local_options(width = 180 )
10
11
repo_data <- rbind(
11
12
data.table :: fread(" revdep-repos" ),
12
13
# land after the initial lines of comments on the header line
@@ -24,7 +25,7 @@ if (length(failed_install) > 0L) {
24
25
25
26
dev_dir <- getwd()
26
27
dev_branch <- system2(" git" , c(" rev-parse" , " --abbrev-ref" , " HEAD" ), stdout = TRUE )
27
- old_release <- " v2 .0.1 "
28
+ old_release <- " v3 .0.2 "
28
29
main <- " main"
29
30
30
31
all_repos <- repo_data $ repo
@@ -208,7 +209,7 @@ summarize_lint_delta <- function(new, old) {
208
209
][, .(line = sprintf(" %s [%s]" , line , linter ), location = paste0(package , " :" , filename ))
209
210
][, print(.SD )]
210
211
211
- NULL
212
+ invisible ()
212
213
}
213
214
214
215
# ---- Main linting execution ----
@@ -229,12 +230,17 @@ main_only <- setdiff(basename(main_results), basename(old_results))
229
230
old_only <- setdiff(basename(old_results ), basename(main_results ))
230
231
shared <- intersect(basename(main_results ), basename(old_results ))
231
232
232
- message(" The following packages warned on " , main , " only: " )
233
- message(" " , toString(match_and_strip(main_only , " \\ .warnings$" )), " \n " )
234
- message(" The following packages warned on " , old_release , " only: " )
235
- message(" " , toString(match_and_strip(old_only , " \\ .warnings$" )), " \n " )
236
- message(" The following packages warned on both branches: " )
237
- message(" " , toString(match_and_strip(shared , " \\ .warnings$" )), " \n " )
233
+ summarize_warned <- function (warned , label ) {
234
+ message(" The following packages warned on " , label , " :" )
235
+ if (length(warned ) > 0 ) {
236
+ message(" " , toString(match_and_strip(warned , " \\ .warnings$" )), " \n " )
237
+ } else {
238
+ message(" None! 🎉" )
239
+ }
240
+ }
241
+ summarize_warned(main_only , " main only" )
242
+ summarize_warned(old_only , paste(old_release , " only" ))
243
+ summarize_warned(shared , " both branches" )
238
244
239
245
main_only <- grep(" warnings$" , main_only , invert = TRUE , value = TRUE )
240
246
old_only <- grep(" warnings$" , old_only , invert = TRUE , value = TRUE )
0 commit comments