vctrs icon indicating copy to clipboard operation
vctrs copied to clipboard

Generic programming with typed R vectors

Results 204 vctrs issues
Sort by recently updated
recently updated
newest added

Closes #579. I think this early exit is less problematic than the one in #1591. ``` r x # A tibble: 4 × 6 #> expression min median `itr/sec` mem_alloc...

Look at the first message: > Subscript has the wrong type `logical`. > It must be logical, numeric, or character. ``` r library(vctrs) vec_as_subscript2(TRUE, logical = "cast") #> Error: #>...

bug
dplyr

Closes #1161 What is the richer type between list and list-of? Following the factor logic, the unconstrained type `character` covers more values than `factor` and is thus richer: ```r vec_c(factor("foo"),...

Closes #1209 I went ahead and soft deprecated `vec_unchop()` as well. I think it is mostly us that use it, so having a soft deprecation warning show up in tests...

Closes #1595 Closes #1489 Another fairly complex PR unfortunately, but I've tried to keep each commit self contained again - I tackled #1489 while I was here, because it was...

Current behaviour: ```r x a #> 1 NA NA ``` I would have expected: ```r #> a b d #> 1 NA NA ``` In the integer and character cases,...

op:slice

I'd like to propose the addition of 2 name repair strings to the standard list of `vec_as_names()`: ``` r vec_as_names( ..., repair = c("minimal", "unique", "universal", "check_unique"), quiet = FALSE,...

To get nice printing when tibble is loaded: ```r vctrs::new_data_frame( list(x = list(1, 2)), class = "tbl" ) #> # A data frame: 2 × 1 #> x #> #>...