Description
I often want to have tests to ensure that the error/warning/message is the same as the expected one. When it is an error internal to the package, it's no trouble. When it is not an error internal to the package, best practice is not to check that the message is the same. But, that inhibits checking that an error from an external package is the desired error.
One way around this is to capture the expected error message, but this is cumbersome (see example below). Would a feature that could capture and verify the message from an external package is the same be of interest? I think that it would apply to expect_error()
, expect_warning()
, and expect_error()
.
I think that it could look something like the following:
expect_error(
myfun(x = c()),
same_message =
{
x <- c()
stopifnot(length(x) == 1)
}
)
myfun <- function(x) {
stopifnot(length(x) == 1)
x
}
expect_error(
myfun(x = c()),
regexp =
attr(
try(
{
x <- c()
stopifnot(length(x) == 1)
},
silent = TRUE
),
"condition"
)$message,
fixed = TRUE
)
#> Error in expect_error(myfun(x = c()), regexp = attr(try({: could not find function "expect_error"
Created on 2024-02-02 with reprex v2.0.2