bind {tidySummarizedExperiment} | R Documentation |
This is an efficient implementation of the common pattern of
do.call(rbind, dfs)
or do.call(cbind, dfs)
for binding many
data frames into one.
... |
Data frames to combine. Each argument can either be a data frame, a list that could be a data frame, or a list of data frames. When row-binding, columns are matched by name, and any missing columns will be filled with NA. When column-binding, rows are matched by position, so all data frames must have the same number of rows. To match by value, not position, see mutate-joins. |
.id |
Data frame identifier. When |
add.cell.ids |
from SummarizedExperiment 3.0 A character vector of length(x=c(x, y)). Appends the corresponding values to the start of each objects' cell names. |
The output of bind_rows()
will contain a column if that column
appears in any of the inputs.
bind_rows()
and bind_cols()
return the same type as
the first input, either a data frame, tbl_df
, or grouped_df
.
`%>%` <- magrittr::`%>%` library(tibble) tt <- tidySummarizedExperiment::pasilla bind_rows(tt, tt) num_rows <- nrow(tidySummarizedExperiment::as_tibble(tt)) tt %>% bind_cols(tibble(a=0, num_rows))