@@ -70,7 +70,7 @@ test_dir <- function(path,
7070 }
7171
7272 if (! is_missing(wrap )) {
73- lifecycle :: deprecate_warn (" 3.0.0" , " test_dir(wrap = )" )
73+ lifecycle :: deprecate_stop (" 3.0.0" , " test_dir(wrap = )" )
7474 }
7575
7676 want_parallel <- find_parallel(path , load_package , package )
@@ -94,7 +94,6 @@ test_dir <- function(path,
9494 env = env ,
9595 stop_on_failure = stop_on_failure ,
9696 stop_on_warning = stop_on_warning ,
97- wrap = wrap ,
9897 load_package = load_package ,
9998 parallel = parallel
10099 )
@@ -150,11 +149,8 @@ test_files <- function(test_dir,
150149 parallel = FALSE ,
151150 error_call = caller_env()) {
152151
153- if (is_missing(wrap )) {
154- wrap <- TRUE
155- }
156152 if (! isTRUE(wrap )) {
157- lifecycle :: deprecate_warn (" 3.0.0" , " test_dir(wrap = )" )
153+ lifecycle :: deprecate_stop (" 3.0.0" , " test_dir(wrap = )" )
158154 }
159155
160156 # Must keep these two blocks in sync
@@ -168,7 +164,6 @@ test_files <- function(test_dir,
168164 env = env ,
169165 stop_on_failure = stop_on_failure ,
170166 stop_on_warning = stop_on_warning ,
171- wrap = wrap ,
172167 load_package = load_package
173168 )
174169 } else {
@@ -182,7 +177,6 @@ test_files <- function(test_dir,
182177 stop_on_failure = stop_on_failure ,
183178 stop_on_warning = stop_on_warning ,
184179 desc = desc ,
185- wrap = wrap ,
186180 load_package = load_package ,
187181 error_call = error_call
188182 )
@@ -216,7 +210,6 @@ test_files_serial <- function(test_dir,
216210 test_one_file ,
217211 env = env ,
218212 desc = desc ,
219- wrap = wrap ,
220213 error_call = error_call
221214 )
222215 )
@@ -325,7 +318,6 @@ test_files_check <- function(results, stop_on_failure = TRUE, stop_on_warning =
325318test_one_file <- function (path ,
326319 env = test_env(),
327320 desc = NULL ,
328- wrap = TRUE ,
329321 error_call = caller_env()) {
330322 reporter <- get_reporter()
331323 on.exit(teardown_run(), add = TRUE )
@@ -334,7 +326,6 @@ test_one_file <- function(path,
334326 source_file(
335327 path ,
336328 env = env(env ),
337- wrap = wrap ,
338329 desc = desc ,
339330 error_call = error_call
340331 )
0 commit comments