-
Notifications
You must be signed in to change notification settings - Fork 283
Closed
Labels
featurea feature request or enhancementa feature request or enhancement
Description
Since they're useful in many places
@gaborcsardi do you already have a mini package for predicates? In purrr, we have:
is_atomic <- function(x) {
typeof(x) %in% c("logical", "integer", "double", "complex", "character", "raw")
}
is_vector <- function(x) {
is_atomic(x) || is.list(x)
}
is_bare_list <- function(x) {
!is.object(x) && is_list(x)
}
etc
Metadata
Metadata
Assignees
Labels
featurea feature request or enhancementa feature request or enhancement