Skip to content

Commit ec92bbd

Browse files
style: message ends with "."
1 parent b226799 commit ec92bbd

File tree

1 file changed

+2
-2
lines changed

1 file changed

+2
-2
lines changed

R/expect-condition.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -300,12 +300,12 @@ cnd_matcher <- function(base_class,
300300
dots_names <- names(list(...))
301301
if (is.null(dots_names) {
302302
cli::cli_abort(
303-
"Found unnamed arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}",
303+
"Found unnamed arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}.",
304304
call = error_call
305305
)
306306
}
307307
cli::cli_abort(
308-
c("Found arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}",
308+
c("Found arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}.",
309309
"*" = "First problematic argument:",
310310
"i" = dots_names[which(nzchar(dots_names))[1L]]
311311
),

0 commit comments

Comments
 (0)