@@ -286,17 +286,17 @@ expect_condition_matching <- function(base_class,
286286
287287cnd_matcher  <-  function (base_class ,
288288                        class  =  NULL ,
289-                         pattern  =  NULL ,
289+                         regexp  =  NULL ,
290290                        ... ,
291291                        inherit  =  TRUE ,
292292                        ignore_deprecation  =  FALSE ,
293293                        error_call  =  caller_env()) {
294294  check_string(class , allow_null  =  TRUE , call  =  error_call )
295-   check_string(pattern , allow_null  =  TRUE , allow_na  =  TRUE , call  =  error_call )
295+   check_string(regexp , allow_null  =  TRUE , allow_na  =  TRUE , call  =  error_call )
296296
297-   if  (is.null(pattern ) &&  dots_n(... ) >  0 ) {
297+   if  (is.null(regexp ) &&  dots_n(... ) >  0 ) {
298298    cli :: cli_abort(
299-       " Can't specify {.arg ...} without {.arg pattern }."  ,
299+       " Can't specify {.arg ...} without {.arg regexp }."  ,
300300      call  =  error_call 
301301    )
302302  }
@@ -317,12 +317,12 @@ cnd_matcher <- function(base_class,
317317      if  (! is.null(class ) &&  ! inherits(x , class )) {
318318        return (FALSE )
319319      }
320-       if  (! is.null(pattern ) &&  ! isNA(pattern )) {
320+       if  (! is.null(regexp ) &&  ! isNA(regexp )) {
321321        withCallingHandlers(
322-           grepl(pattern , conditionMessage(x ), ... ),
322+           grepl(regexp , conditionMessage(x ), ... ),
323323          error  =  function (e ) {
324324            cli :: cli_abort(
325-               " Failed to compare {base_class} to {.arg pattern }."  ,
325+               " Failed to compare {base_class} to {.arg regexp }."  ,
326326              parent  =  e ,
327327              call  =  error_call 
328328            )
0 commit comments