Skip to content

Commit be4c8fe

Browse files
committed
Move vctrs wrappers
1 parent f2ece98 commit be4c8fe

File tree

2 files changed

+22
-18
lines changed

2 files changed

+22
-18
lines changed

R/across.R

Lines changed: 0 additions & 18 deletions
Original file line numberDiff line numberDiff line change
@@ -366,24 +366,6 @@ if_all <- function(.cols, .fns, ..., .names = NULL) {
366366
dplyr_list_pall(x, size = size)
367367
}
368368

369-
dplyr_list_pall <- function(
370-
x,
371-
...,
372-
size = NULL,
373-
error_call = caller_env()
374-
) {
375-
vec_pall(!!!x, .size = size, .error_call = error_call)
376-
}
377-
378-
dplyr_list_pany <- function(
379-
x,
380-
...,
381-
size = NULL,
382-
error_call = caller_env()
383-
) {
384-
vec_pany(!!!x, .size = size, .error_call = error_call)
385-
}
386-
387369
#' Combine values from multiple columns
388370
#'
389371
#' @description

R/vctrs.R

Lines changed: 22 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -46,3 +46,25 @@ dplyr_list_recycle_common <- function(
4646
check_dots_empty0(...)
4747
vec_recycle_common(!!!x, .size = size, .call = call)
4848
}
49+
50+
dplyr_list_pall <- function(
51+
x,
52+
...,
53+
missing = NA,
54+
size = NULL,
55+
error_call = caller_env()
56+
) {
57+
check_dots_empty0(...)
58+
vec_pall(!!!x, .missing = missing, .size = size, .error_call = error_call)
59+
}
60+
61+
dplyr_list_pany <- function(
62+
x,
63+
...,
64+
missing = NA,
65+
size = NULL,
66+
error_call = caller_env()
67+
) {
68+
check_dots_empty0(...)
69+
vec_pany(!!!x, .missing = missing, .size = size, .error_call = error_call)
70+
}

0 commit comments

Comments
 (0)