Skip to content

Commit de6358f

Browse files
Merge pull request #324 from lorenzwalthert/hotfix-dplyr
- remove implicit dplyr dependency (#324).
2 parents 1d71bc2 + 240dc52 commit de6358f

File tree

3 files changed

+9
-2
lines changed

3 files changed

+9
-2
lines changed

NAMESPACE

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -14,14 +14,14 @@ export(tidyverse_reindention)
1414
export(tidyverse_style)
1515
import(tibble)
1616
importFrom(magrittr,"%>%")
17+
importFrom(purrr,as_mapper)
1718
importFrom(purrr,compact)
1819
importFrom(purrr,flatten)
1920
importFrom(purrr,flatten_chr)
2021
importFrom(purrr,flatten_int)
2122
importFrom(purrr,map)
2223
importFrom(purrr,map2)
2324
importFrom(purrr,map_chr)
24-
importFrom(purrr,map_dfr)
2525
importFrom(purrr,map_lgl)
2626
importFrom(purrr,partial)
2727
importFrom(purrr,pmap)

R/dplyr.R

Lines changed: 8 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -110,3 +110,11 @@ last <- function(x, order_by = NULL, default = x[NA_real_]) {
110110
slice <- function(.data, ...) {
111111
.data[c(...), , drop = FALSE]
112112
}
113+
114+
#' @importFrom purrr as_mapper map
115+
map_dfr <- function (.x, .f, ..., .id = NULL) {
116+
.f <- as_mapper(.f, ...)
117+
res <- map(.x, .f, ...)
118+
bind_rows(res, .id = .id)
119+
}
120+

R/relevel.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -144,7 +144,6 @@ relocate_eq_assign <- function(pd) {
144144
#' Please refer to the section 'Examples' in [relocate_eq_assign()] for details.
145145
#' @param pd A parse table.
146146
#' @importFrom rlang seq2
147-
#' @importFrom purrr map_dfr
148147
relocate_eq_assign_nest <- function(pd) {
149148
idx_eq_assign <- which(pd$token == "EQ_ASSIGN")
150149
if (length(idx_eq_assign) > 0) {

0 commit comments

Comments
 (0)