| joinExpData {Genominator} | R Documentation |
This function merges multiple ExpData object into one in an efficient manner.
joinExpData(expDataList, fields = NULL, tablename = "aggtable",
overwrite = TRUE, deleteOriginals = FALSE,
verbose = getOption("verbose"))
expDataList |
List of |
fields |
A named list whose names correspond to tables of |
tablename |
Name of database table to write output data to. |
overwrite |
Logical indicating whether database table referred to in |
deleteOriginals |
Logical indicating whether original database tables in |
verbose |
Logical indicating whether details should be printed. |
An object of class ExpData containing data columns from all the original ExpData objects.
James Bullard bullard@berkeley.edu, Kasper Daniel Hansen khansen@jhsph.edu
See Genominator vignette for more information.
N <- 10000 # the number of observations.
df1 <- data.frame(chr = sample(1:16, size = N, replace = TRUE),
location = sample(1:1000, size = N, replace = TRUE),
strand = sample(c(1L,-1L), size = N, replace = TRUE))
df2 <- data.frame(chr = sample(1:16, size = N, replace = TRUE),
location = sample(1:1000, size = N, replace = TRUE),
strand = sample(c(1L,-1L), size = N, replace = TRUE))
eDataRaw1 <- aggregateExpData(importToExpData(df1, dbFilename = "my.db",
tablename = "ex_tbl_1", overwrite = TRUE))
eDataRaw2 <- aggregateExpData(importToExpData(df1, dbFilename = "my.db",
tablename = "ex_tbl_2", overwrite = TRUE))
jd <- joinExpData(list(eDataRaw1, eDataRaw2), tablename = "combined",
fields = list("ex_tbl_1" = c("counts" = "e1"),
"ex_tbl_2" = c("counts" = "e2")))
head(jd)