-
Notifications
You must be signed in to change notification settings - Fork 417
Closed
Labels
featurea feature request or enhancementa feature request or enhancementnesting 🐦nesting, chopping, and packingnesting, chopping, and packing
Description
Before calling the method corresponding to the class the nest()
generic tries to name any unnamed dots. This doesn't work for lazy tibbles:
library(dtplyr)
library(tidyr)
dt <- lazy_dt(tibble(x = c(1, 2, 1), y = c("a", "a", "b")))
dt %>% nest(y)
#> Error: `x` must be a vector, not a <dtplyr_step_first/dtplyr_step> object.
Created on 2021-07-01 by the reprex package (v2.0.0)
The issue is the following line
col_names <- names(tidyselect::eval_select(expr(c(...)), .data))
The question is how to handle this?
- Should each method implement this functionality itself? Probably not.
- Should
nest()
get the underlying tibble of.data
? But what about predicates (column types)? See Optionally suppress use of predicates r-lib/tidyselect#226. - Should
eval_select()
be able to handle this?
Metadata
Metadata
Assignees
Labels
featurea feature request or enhancementa feature request or enhancementnesting 🐦nesting, chopping, and packingnesting, chopping, and packing