diff --git a/NAMESPACE b/NAMESPACE index 059167f1..21e15dc3 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -356,7 +356,6 @@ export(contains) export(ends_with) export(everything) export(form_pred) -export(gather) export(get_rsplit) export(group_bootstraps) export(group_initial_split) @@ -450,7 +449,6 @@ importFrom(tibble,as_tibble) importFrom(tibble,is_tibble) importFrom(tibble,obj_sum) importFrom(tibble,tibble) -importFrom(tidyr,gather) importFrom(tidyr,unnest) importFrom(tidyselect,all_of) importFrom(tidyselect,any_of) diff --git a/NEWS.md b/NEWS.md index a0d1d44d..7103ddac 100644 --- a/NEWS.md +++ b/NEWS.md @@ -14,6 +14,7 @@ * The underlying mechanics of data splitting were changed so that `Surv` objects maintain their class. This change affects the row names of the resulting objects; they are reindexed from one instead of being a subset of the original row names. (#443) +* rsample does not re-export `gather()` anymore (#451). # rsample 1.1.1 diff --git a/R/reexports.R b/R/reexports.R index f1f9b492..0173cd22 100644 --- a/R/reexports.R +++ b/R/reexports.R @@ -1,8 +1,3 @@ #' @importFrom generics tidy #' @export generics::tidy - - -#' @importFrom tidyr gather -#' @export -tidyr::gather diff --git a/R/rsample-package.R b/R/rsample-package.R index dc71e080..56be5b76 100644 --- a/R/rsample-package.R +++ b/R/rsample-package.R @@ -12,7 +12,7 @@ NULL #' @importFrom purrr map map2 map_dbl pluck map_lgl list_rbind #' @importFrom tibble tibble is_tibble as_tibble obj_sum #' @importFrom pillar type_sum -#' @importFrom tidyr gather unnest +#' @importFrom tidyr unnest #' @importFrom dplyr select %>% bind_cols bind_rows arrange_ arrange full_join #' @importFrom dplyr mutate last ungroup group_by inner_join summarize do case_when #' @importFrom vctrs vec_unique_count vec_count vec_slice vec_in vec_ptype_abbr @@ -22,7 +22,6 @@ NULL #' @importFrom stats quantile setNames qnorm pnorm dist #' @importFrom tidyselect vars_select one_of #' @importFrom furrr future_map -#' @importFrom tidyr gather #------------------------------------------------------------------------------# diff --git a/man/reexports.Rd b/man/reexports.Rd index 5954c518..d7cffbab 100644 --- a/man/reexports.Rd +++ b/man/reexports.Rd @@ -4,7 +4,6 @@ \name{reexports} \alias{reexports} \alias{tidy} -\alias{gather} \alias{contains} \alias{select_helpers} \alias{ends_with} @@ -24,8 +23,6 @@ below to see their documentation. \describe{ \item{generics}{\code{\link[generics]{tidy}}} - \item{tidyr}{\code{\link[tidyr]{gather}}} - \item{tidyselect}{\code{\link[tidyselect]{all_of}}, \code{\link[tidyselect:all_of]{any_of}}, \code{\link[tidyselect:starts_with]{contains}}, \code{\link[tidyselect:starts_with]{ends_with}}, \code{\link[tidyselect]{everything}}, \code{\link[tidyselect:everything]{last_col}}, \code{\link[tidyselect:starts_with]{matches}}, \code{\link[tidyselect:starts_with]{num_range}}, \code{\link[tidyselect]{starts_with}}} }}