Skip to content

Commit

Permalink
Set use_cli_format = TRUE
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr committed Sep 4, 2022
1 parent 69518e5 commit f2bc7b3
Show file tree
Hide file tree
Showing 2 changed files with 3 additions and 2 deletions.
2 changes: 1 addition & 1 deletion R/error.R
Original file line number Diff line number Diff line change
Expand Up @@ -22,5 +22,5 @@ tibble_error <- function(x, ..., parent = NULL) {
call <- sys.call(-1)
fn_name <- as_name(call[[1]])
class <- tibble_error_class(gsub("^error_", "", fn_name))
error_cnd(class, ..., message = x, parent = parent)
error_cnd(class, ..., message = x, parent = parent, use_cli_format = TRUE)
}
3 changes: 2 additions & 1 deletion tests/testthat/test-error.R
Original file line number Diff line number Diff line change
Expand Up @@ -9,7 +9,8 @@ test_that("tibble_error()", {
class = c("tibble_error_foo", "tibble_error"),
message = "message",
foo = 42,
bar = 7
bar = 7,
use_cli_format = TRUE
)
)
})
Expand Down

0 comments on commit f2bc7b3

Please sign in to comment.