You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
Thanks again for this awesome library! I can tell y'all really value your docs, so I wanted to relay some minor (afaikt) inaccuracies I found in the documentation while learning the library that caused me brief confusions:
This should be vec_proxy_equal(), not vec_proxy() right?
#' * ==, !=, unique(), anyDuplicated(), and is.na() use
#' [vec_proxy()].
vctrs provides the hybrid S3 generics/methods for most of the base R types, like vec_arith.integer().
If you don't fully import vctrs with @import vctrs, then you will need to explicitly import the generic you are registering double dispatch methods for with @importFrom vctrs vec_arith.integer.
The documentation for vec_slice() says it will slice the proxy (if available) and then vec_restore(). But in type-rcrd.R there's this definition:
`[[.vctrs_rcrd`<-function(x, i, ...) {
out<- vec_slice(vec_data(x), i)
vec_restore(out, x)
}
Does that mean the calls to vec_data() and vec_restore() are technically unnecessary here? Or is there some other magic I'm missing that makes it necessary?
The text was updated successfully, but these errors were encountered:
Thanks again for this awesome library! I can tell y'all really value your docs, so I wanted to relay some minor (afaikt) inaccuracies I found in the documentation while learning the library that caused me brief confusions:
vec_proxy_equal()
, notvec_proxy()
right?https://github.com/r-lib/vctrs/blob/8bf5ba59bae73705f460ef326b725023cff46efa/R/type-vctr.R#L39C1-L40C20
vctrs_vctr
,quantile()
andmedian()
are not implemented.https://github.com/r-lib/vctrs/blob/8bf5ba59bae73705f460ef326b725023cff46efa/R/type-vctr.R#L42C1-L43C68
vec_arith.double()
orvec_arith.integer()
S3 generic... it actually only providesvec_arith.numeric()
andvec_arith.logical()
https://github.com/r-lib/vctrs/blob/8bf5ba59bae73705f460ef326b725023cff46efa/vignettes/s3-vector.Rmd#L1317C1-L1319C1
vec_slice()
says it will slice the proxy (if available) and thenvec_restore()
. But in type-rcrd.R there's this definition:Does that mean the calls to
vec_data()
andvec_restore()
are technically unnecessary here? Or is there some other magic I'm missing that makes it necessary?The text was updated successfully, but these errors were encountered: