We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent b226799 commit ec92bbdCopy full SHA for ec92bbd
R/expect-condition.R
@@ -300,12 +300,12 @@ cnd_matcher <- function(base_class,
300
dots_names <- names(list(...))
301
if (is.null(dots_names) {
302
cli::cli_abort(
303
- "Found unnamed arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}",
+ "Found unnamed arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}.",
304
call = error_call
305
)
306
}
307
308
- c("Found arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}",
+ c("Found arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}.",
309
"*" = "First problematic argument:",
310
"i" = dots_names[which(nzchar(dots_names))[1L]]
311
),
0 commit comments