Skip to content

Commit 0072b66

Browse files
we can assume R 4.1.0 now :)
1 parent e06c270 commit 0072b66

File tree

1 file changed

+1
-2
lines changed

1 file changed

+1
-2
lines changed

R/expect-condition.R

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -296,8 +296,7 @@ cnd_matcher <- function(base_class,
296296

297297
if (is.null(regexp) && dots_n(...) > 0) {
298298
# pretty adversarial: expect_error(foo(), NULL, "error", 1)
299-
# TODO(R>=4.1.0): ...names()
300-
dots_names <- names(list(...))
299+
dots_names <- ...names()
301300
if (is.null(dots_names) {
302301
cli::cli_abort(
303302
"Found unnamed arguments in {.arg ...} to be passed to {.fn grepl}, but no {.arg regexp}.",

0 commit comments

Comments
 (0)