set_funs {BiocSet} | R Documentation |
BiocSet
objectAll of the major methods applied to a BiocSet
object can
be explicitly applied to the set tibble. These functions bypass the need
to use the es_activate
function by indicating what function should
be used on the element tibble.
filter_set(.data, ...) select_set(.data, ...) mutate_set(.data, ...) summarise_set(.data, ...) arrange_set(.data, ...) left_join_set(.data, ...) tibble_from_set(.data, how = unlist) data.frame_from_set(.data, how = unlist)
.data |
A |
... |
Additional argument passed to the function. |
how |
Multiple entries will become a list. |
A BiocSet
object.
For tibble_from_set
, a tibble.
For data.frame_from_set
, a data.frame.
es <- BiocSet(set1 = letters, set2 = LETTERS) filter_set(es, set == "set1") es %>% select_set(set) es %>% mutate_set(pval = rnorm(1:2)) es %>% summarise_set(n = n()) es %>% arrange_set(desc(set)) tbl <- tibble(x = 10:11, y = c("set1", "set2")) es <- BiocSet(set1 = letters[c(1,3,5)], set2 = letters[c(2,4)]) left_join_set(es, tbl, by = c(set = "y")) tibble_from_set(es) data.frame_from_set(es)