Skip to content

Commit 3ddadcb

Browse files
Apply suggestions from code review
Co-authored-by: Michael Chirico <[email protected]>
1 parent 5af66e5 commit 3ddadcb

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/expect-condition.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -596,7 +596,7 @@ check_condition_dots <- function(
596596
cli::cli_abort(
597597
c(
598598
"Can't supply {.arg ...} unless {.arg regexp} is set.",
599-
"*" = "Unusued arguments: {.arg {dot_names}}.",
599+
"*" = "Unused arguments: {.arg {dot_names}}.",
600600
i = "{.arg ...} is passed to {.fn grepl} if and only if the {.arg regexp} argument is used."
601601
),
602602
call = error_call

tests/testthat/test-expect-condition.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -244,7 +244,7 @@ test_that("unused arguments generate an error", {
244244
expect_snapshot(error = TRUE, {
245245
expect_condition(stop("Hi!"), foo = "bar")
246246
expect_condition(stop("Hi!"), , , "bar")
247-
expect_condition(stop("Hi!"), , , "bar", foo = "bar")
247+
expect_condition(stop("Hi!"), , , "bar", fixed = TRUE)
248248
expect_condition(stop("Hi!"), "x", foo = "bar")
249249
})
250250
})

0 commit comments

Comments
 (0)