Skip to content

Commit 32ee982

Browse files
committed
Revert compat-purrr.R to ad7fe11.
As per #585 (comment)
1 parent aa98d94 commit 32ee982

File tree

1 file changed

+3
-1
lines changed

1 file changed

+3
-1
lines changed

R/compat-purrr.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -10,7 +10,9 @@ map <- function(.x, .f, ...) {
1010
lapply(.x, .f, ...)
1111
}
1212
map_mold <- function(.x, .f, .mold, ...) {
13-
copy_names(.x, vapply(.x, .f, .mold, ..., USE.NAMES = FALSE))
13+
out <- vapply(.x, .f, .mold, ..., USE.NAMES = FALSE)
14+
names(out) <- names(.x)
15+
out
1416
}
1517
map_lgl <- function(.x, .f, ...) {
1618
map_mold(.x, .f, logical(1), ...)

0 commit comments

Comments
 (0)