File tree Expand file tree Collapse file tree 2 files changed +36
-2
lines changed Expand file tree Collapse file tree 2 files changed +36
-2
lines changed Original file line number Diff line number Diff line change 1010
1111* ` cran_check_results() ` works again.
1212
13+ * ` rcmdcheck() ` now will print rcheck envvars ([ #172 ] ( https://github.com/r-lib/rcmdcheck/issues/172 ) )
14+
1315# rcmdcheck 1.4.0
1416
1517* ` cran_check_results() ` now downloads results in parallel, so it is
Original file line number Diff line number Diff line change @@ -227,9 +227,41 @@ do_check <- function(
227227 }
228228
229229 # user supplied env vars take precedence
230- if (length(env )) chkenv [names(env )] <- env
230+ if (length(env )) {
231+ chkenv [names(env )] <- env
232+ }
233+
234+ if (! quiet ) {
235+ cat_head(" R CMD check" )
236+ cat_line()
237+ all_vars <- Sys.getenv()
238+ rchk_vars <- all_vars [
239+ grep(" _R_CHECK|NOT_CRAN|RCMDCHECK|R_TESTS" , names(all_vars ))
240+ ]
241+ rchk_vars [names(env )] <- env
242+ if (length(rchk_vars ) == 0 ) {
243+ cli :: cat_bullet(
244+ " No R CMD check env vars set" ,
245+ col = " darkgrey" ,
246+ bullet = " line" ,
247+ bullet_col = " darkgrey"
248+ )
249+ }
250+ if (length(rchk_vars ) > 0 ) {
251+ cli :: cat_bullet(
252+ " R CMD check env vars set:" ,
253+ col = " darkgrey" ,
254+ bullet = " line" ,
255+ bullet_col = " darkgrey"
256+ )
257+ cli :: cat_bullet(
258+ paste0(format(names(rchk_vars )), " = " , unname(rchk_vars )),
259+ col = " darkgrey"
260+ )
261+ cat_line()
262+ }
263+ }
231264
232- if (! quiet ) cat_head(" R CMD check" )
233265 callback <- if (! quiet ) detect_callback(as_cran = " --as-cran" %in% args )
234266 res <- rcmd_safe(
235267 " check" ,
You can’t perform that action at this time.
0 commit comments