Skip to content

Commit

Permalink
Merge pull request #264 from tidymodels/docs-check_quantile_levels
Browse files Browse the repository at this point in the history
Fix docs for `check_quantile_levels()`
  • Loading branch information
hfrick authored Oct 21, 2024
2 parents 278633a + 6968ebf commit 44dba39
Show file tree
Hide file tree
Showing 2 changed files with 3 additions and 3 deletions.
4 changes: 2 additions & 2 deletions R/quantile-pred.R
Original file line number Diff line number Diff line change
Expand Up @@ -152,7 +152,7 @@ check_quantile_pred_inputs <- function(values, levels, call = caller_env()) {

#' Check levels of quantiles
#' @param levels The quantile levels.
#' @param arg,call Inputs to use to write error messages
#' @param call Call shown in the error messages.
#' @return Invisible `TRUE`
#' @keywords internal
#' @details
Expand All @@ -169,7 +169,7 @@ check_quantile_levels <- function(levels, call = rlang::caller_env()) {
redund <- unique(redund)
redund <- signif(redund, digits = 5)
cli::cli_abort(c(
"Quantile levels should be unique.",
"Quantile levels should be unique.",
i = "The following {cli::qty(length(redund))}value{?s} {?was/were} repeated:
{redund}."),
call = call
Expand Down
2 changes: 1 addition & 1 deletion man/check_quantile_levels.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 44dba39

Please sign in to comment.