Skip to content

Commit

Permalink
don't re-export vctrs generics
Browse files Browse the repository at this point in the history
  • Loading branch information
hfrick committed Sep 18, 2024
1 parent d0444bd commit c597214
Show file tree
Hide file tree
Showing 3 changed files with 0 additions and 33 deletions.
6 changes: 0 additions & 6 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -106,7 +106,6 @@ export(new_importance_weights)
export(new_model)
export(new_recipe_blueprint)
export(new_xy_blueprint)
export(obj_print_footer)
export(quantile_pred)
export(recompose)
export(refresh_blueprint)
Expand All @@ -133,8 +132,6 @@ export(validate_outcomes_are_numeric)
export(validate_outcomes_are_univariate)
export(validate_prediction_size)
export(validate_predictors_are_numeric)
export(vec_ptype_abbr)
export(vec_ptype_full)
export(weighted_table)
import(rlang)
import(vctrs)
Expand All @@ -147,6 +144,3 @@ importFrom(stats,model.matrix)
importFrom(stats,terms)
importFrom(tibble,as_tibble)
importFrom(tibble,tibble)
importFrom(vctrs,obj_print_footer)
importFrom(vctrs,vec_ptype_abbr)
importFrom(vctrs,vec_ptype_full)
9 changes: 0 additions & 9 deletions R/quantile-pred.R
Original file line number Diff line number Diff line change
Expand Up @@ -159,12 +159,6 @@ median.quantile_pred <- function(x, ...) {
map_dbl(x, ~ stats::approx(lvls, .x, xout = 0.5)$y)
}

#' @export
vctrs::vec_ptype_abbr

#' @export
vctrs::vec_ptype_full

#' @export
vec_ptype_abbr.quantile_pred <- function(x, ...) {
n_lvls <- length(attr(x, "quantile_levels"))
Expand All @@ -174,9 +168,6 @@ vec_ptype_abbr.quantile_pred <- function(x, ...) {
#' @export
vec_ptype_full.quantile_pred <- function(x, ...) "quantiles"

#' @export
vctrs::obj_print_footer

#' @export
obj_print_footer.quantile_pred <- function(x, digits = 3, ...) {
lvls <- attr(x, "quantile_levels")
Expand Down
18 changes: 0 additions & 18 deletions man/reexports.Rd

This file was deleted.

0 comments on commit c597214

Please sign in to comment.