Skip to content

Commit 7873bcc

Browse files
missing ")"
1 parent 0072b66 commit 7873bcc

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/expect-condition.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -297,7 +297,7 @@ cnd_matcher <- function(base_class,
297297
if (is.null(regexp) && dots_n(...) > 0) {
298298
# pretty adversarial: expect_error(foo(), NULL, "error", 1)
299299
dots_names <- ...names()
300-
if (is.null(dots_names) {
300+
if (is.null(dots_names)) {
301301
cli::cli_abort(
302302
"Found unnamed arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}.",
303303
call = error_call

0 commit comments

Comments
 (0)