Skip to content

Commit 828cecd

Browse files
committed
last stop -> cli()
1 parent a3e8452 commit 828cecd

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/bagger.R

+1-1
Original file line numberDiff line numberDiff line change
@@ -97,7 +97,7 @@ bagger <- function(x, ...) {
9797
#' @export
9898
#' @rdname bagger
9999
bagger.default <- function(x, ...) {
100-
stop("`bagger()` is not defined for a '", class(x)[1], "'.", call. = FALSE)
100+
cli::cli_abort("{.fn bagger} is not defined for a {.cls {class(x)[1]}}.")
101101
}
102102

103103
# XY method - data frame

0 commit comments

Comments
 (0)