Skip to content

Commit 7dfe606

Browse files
authored
Re-export any_of() and all_of() (#1220)
* Re-export `any_of()` and `all_of()` * NEWS bullet
1 parent effa091 commit 7dfe606

File tree

4 files changed

+19
-7
lines changed

4 files changed

+19
-7
lines changed

NAMESPACE

+3
Original file line numberDiff line numberDiff line change
@@ -37,6 +37,8 @@ S3method(unnest,data.frame)
3737
S3method(unnest,rowwise_df)
3838
S3method(unnest_legacy,data.frame)
3939
export("%>%")
40+
export(all_of)
41+
export(any_of)
4042
export(as_tibble)
4143
export(build_longer_spec)
4244
export(build_wider_spec)
@@ -134,6 +136,7 @@ importFrom(purrr,transpose)
134136
importFrom(tibble,as_tibble)
135137
importFrom(tibble,tibble)
136138
importFrom(tibble,tribble)
139+
importFrom(tidyselect,all_of)
137140
importFrom(tidyselect,any_of)
138141
importFrom(tidyselect,contains)
139142
importFrom(tidyselect,ends_with)

NEWS.md

+2
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,7 @@
11
# tidyr (development version)
22

3+
* `any_of()` and `all_of()` from tidyselect are now re-exported (#1217).
4+
35
* `unchop()` now respects `ptype` when unnesting a non-list column (#1211).
46

57
* The `nest()` generic now avoids computing on `.data`, making it more

R/tidyr.R

+9-4
Original file line numberDiff line numberDiff line change
@@ -9,7 +9,6 @@
99
#' @importFrom dplyr tbl_vars
1010
#' @importFrom utils type.convert
1111
#' @importFrom lifecycle deprecated
12-
#' @importFrom tidyselect any_of
1312
#' @useDynLib tidyr, .registration = TRUE
1413
"_PACKAGE"
1514

@@ -29,6 +28,12 @@ tibble::as_tibble
2928

3029

3130
#' @aliases select_helpers
31+
#' @importFrom tidyselect all_of
32+
#' @export
33+
tidyselect::all_of
34+
#' @importFrom tidyselect any_of
35+
#' @export
36+
tidyselect::any_of
3237
#' @importFrom tidyselect contains
3338
#' @export
3439
tidyselect::contains
@@ -38,6 +43,9 @@ tidyselect::ends_with
3843
#' @importFrom tidyselect everything
3944
#' @export
4045
tidyselect::everything
46+
#' @importFrom tidyselect last_col
47+
#' @export
48+
tidyselect::last_col
4149
#' @importFrom tidyselect matches
4250
#' @export
4351
tidyselect::matches
@@ -50,6 +58,3 @@ tidyselect::one_of
5058
#' @importFrom tidyselect starts_with
5159
#' @export
5260
tidyselect::starts_with
53-
#' @importFrom tidyselect last_col
54-
#' @export
55-
tidyselect::last_col

man/reexports.Rd

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

0 commit comments

Comments
 (0)