-
Notifications
You must be signed in to change notification settings - Fork 2.1k
Closed
Description
Currently data.frame columns are dropped when they don't satisfy the checks of check_nondata_cols
which looks like the following:
check_nondata_cols <- function(x) {
idx <- (vapply(x, function(x) is.null(x) || rlang::is_vector(x), logical(1)))
names(x)[which(!idx)]
}
The reason I would like it to be more lenient is such that vector-like columns which technically aren't vectors could be accepted, specifically for the virtual S4Vectors::Vector-class
(and non-virtual classes containing this). This would open up channels to have Bioconductor work with ggplot2 more naturally, provided some extra infrastructure is implemented at the scale/coordinate level (which could befit a ggplot extention package).
I would propose to change check_nondata_cols
to the following:
check_nondata_cols <- function(x) {
idx <- (vapply(x, function(x) is.null(x) || rlang::is_vector(x) || inherits(x, "Vector"), logical(1)))
names(x)[which(!idx)]
}
Thanks you for reading and considering!
Metadata
Metadata
Assignees
Labels
No labels