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

- Coercion methods: data frames are promoted to grouped-df. The common type has the union of the groups. - Proxy and restore methods: Group columns are instrumented in the proxy...

- Uses `vec_slice()` tools, except for non-shaped lists, where we actually extract out the inner elements. - Names are not kept. These include atomic names, data frame row names, and...

In the stability vignette, when [discussing `vec_c()` and dates/date-times](https://vctrs.r-lib.org/articles/stability.html#dates-and-date-times) the documentation says: > When you mix dates and date-times, vctrs returns a date-time and converts dates to date-times at midnight...

closes https://github.com/tidyverse/dplyr/issues/5629 ``` r library(vctrs) vec_ptype2( c("a", "b"), structure(c("c", "d"), class = "character") ) #> Error: `vec_ptype2.character.character()` is implemented at C level. #> This R function is purely indicative and...

type:fallback

I was expecting that by default the size of a vctr is equal to the size of its proxy. However, in the following example the length of the proxy is...

I was wondering why the new implementation of `unnest_wider()` is so slow and memory hungry for tibble columns. It turned out to be an issue with `vec_unchop()`: ``` r library(vctrs)...

type:listof
performance

For certain input data types (but not all) if `vec_rbind` is called with a value for the `.id` parameter, then the last column is assigned the class `vctrs:::common_class_fallback` instead of...

bug
op:bind-combine
type:fallback

This is somewhat related to #1301 Discovered from looking at https://stackoverflow.com/questions/70794504/using-native-time-in-clock-package-and-having-error-with-rbind-error-levels-c I have discovered that even with the `levels.vctrs_vctr` fix, we still can't call `rbind()` if we have a rcrd...

feature
op:slice
type:rcrd

``` r library(vctrs) library(tibble) x

bug
op:bind-combine
type:fallback

```r vctrs::vec_c(1, 1, "") #> Error in `vec_c()`: #> ! Can't combine `..1` and `..3` . vctrs::vec_c(1, 1, "", .ptype = int()) #> Error in `vec_c()`: #> ! Can't convert...

op:bind-combine
conditions