Skip to content

Commit

Permalink
cli_warn() is now already imported
Browse files Browse the repository at this point in the history
  • Loading branch information
hfrick committed Sep 11, 2024
1 parent 576ff6f commit 826dc2a
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/bootci.R
Original file line number Diff line number Diff line change
Expand Up @@ -129,7 +129,7 @@ check_num_resamples <- function(x, B = 1000) {

if (nrow(x) > 0) {
terms <- x$term
cli::cli_warn("Recommend at least {B} non-missing bootstrap resamples for {cli::qty(terms)} term{?s} {.code {terms}}.")
cli_warn("Recommend at least {B} non-missing bootstrap resamples for {cli::qty(terms)} term{?s} {.code {terms}}.")
}
invisible(NULL)
}
Expand Down

0 comments on commit 826dc2a

Please sign in to comment.