Skip to content

Commit fe41593

Browse files
authored
remove re-export of gather() (#451)
* remove re-export of `gather()` * update news
1 parent 342cfd4 commit fe41593

File tree

5 files changed

+2
-12
lines changed

5 files changed

+2
-12
lines changed

NAMESPACE

-2
Original file line numberDiff line numberDiff line change
@@ -356,7 +356,6 @@ export(contains)
356356
export(ends_with)
357357
export(everything)
358358
export(form_pred)
359-
export(gather)
360359
export(get_rsplit)
361360
export(group_bootstraps)
362361
export(group_initial_split)
@@ -450,7 +449,6 @@ importFrom(tibble,as_tibble)
450449
importFrom(tibble,is_tibble)
451450
importFrom(tibble,obj_sum)
452451
importFrom(tibble,tibble)
453-
importFrom(tidyr,gather)
454452
importFrom(tidyr,unnest)
455453
importFrom(tidyselect,all_of)
456454
importFrom(tidyselect,any_of)

NEWS.md

+1
Original file line numberDiff line numberDiff line change
@@ -14,6 +14,7 @@
1414

1515
* 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)
1616

17+
* rsample does not re-export `gather()` anymore (#451).
1718

1819
# rsample 1.1.1
1920

R/reexports.R

-5
Original file line numberDiff line numberDiff line change
@@ -1,8 +1,3 @@
11
#' @importFrom generics tidy
22
#' @export
33
generics::tidy
4-
5-
6-
#' @importFrom tidyr gather
7-
#' @export
8-
tidyr::gather

R/rsample-package.R

+1-2
Original file line numberDiff line numberDiff line change
@@ -12,7 +12,7 @@ NULL
1212
#' @importFrom purrr map map2 map_dbl pluck map_lgl list_rbind
1313
#' @importFrom tibble tibble is_tibble as_tibble obj_sum
1414
#' @importFrom pillar type_sum
15-
#' @importFrom tidyr gather unnest
15+
#' @importFrom tidyr unnest
1616
#' @importFrom dplyr select %>% bind_cols bind_rows arrange_ arrange full_join
1717
#' @importFrom dplyr mutate last ungroup group_by inner_join summarize do case_when
1818
#' @importFrom vctrs vec_unique_count vec_count vec_slice vec_in vec_ptype_abbr
@@ -22,7 +22,6 @@ NULL
2222
#' @importFrom stats quantile setNames qnorm pnorm dist
2323
#' @importFrom tidyselect vars_select one_of
2424
#' @importFrom furrr future_map
25-
#' @importFrom tidyr gather
2625

2726
#------------------------------------------------------------------------------#
2827

man/reexports.Rd

-3
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)