@@ -77,8 +77,7 @@ compare_file <- function(path, lines, ..., update = TRUE, info = NULL) {
7777 if (! file.exists(path )) {
7878 warning(" Creating reference output" , call. = FALSE )
7979 brio :: write_lines(lines , path )
80- succeed()
81- return ()
80+ return (pass(NULL ))
8281 }
8382
8483 old_lines <- brio :: read_lines(path )
@@ -107,7 +106,7 @@ compare_file <- function(path, lines, ..., update = TRUE, info = NULL) {
107106 )
108107 fail(msg , info = info , trace_env = caller_env())
109108 }
110- succeed( )
109+ pass( NULL )
111110}
112111
113112# ' Expectations: is the output or the value equal to a known good value?
@@ -170,7 +169,6 @@ expect_known_value <- function(
170169 if (! file.exists(file )) {
171170 warning(" Creating reference value" , call. = FALSE )
172171 saveRDS(object , file , version = version )
173- succeed()
174172 } else {
175173 ref_val <- readRDS(file )
176174 comp <- compare(act $ val , ref_val , ... )
@@ -187,10 +185,9 @@ expect_known_value <- function(
187185 )
188186 fail(msg , info = info )
189187 }
190- succeed()
191188 }
192189
193- invisible (act $ value )
190+ pass (act $ value )
194191}
195192
196193# ' @export
@@ -225,16 +222,14 @@ expect_known_hash <- function(object, hash = NULL) {
225222
226223 if (is.null(hash )) {
227224 warning(paste0(" No recorded hash: use " , substr(act_hash , 1 , 10 )))
228- succeed()
229225 } else {
230226 if (hash != act_hash ) {
231227 msg <- sprintf(" Value hashes to %s, not %s" , act_hash , hash )
232228 fail(msg )
233229 }
234- succeed()
235230 }
236231
237- invisible (act $ value )
232+ pass (act $ value )
238233}
239234
240235all_utf8 <- function (x ) {
0 commit comments