getFeature {VennDetail} | R Documentation |
GetFeature allows users to extract subsets from venn object into a table format along with accompanying information from the data frames provided in the rlist argument
getFeature(object, subset, rlist, userowname = TRUE, gind = NULL, sep = "_", wide = FALSE) ## S4 method for signature 'Venn' getFeature(object, subset, rlist, userowname = TRUE, gind = NULL, sep = "_", wide = FALSE)
object |
Venn object |
subset |
Character vector giving the names of the user-defined subset to extract |
rlist |
List of user-supplied data frames to combine with venndetail result |
userowname |
Boolean indicating whether to use row names to join data frames or not (default: TRUE) |
gind |
Column name or index of each user-supplied data.frame to use to join data frames(valid only when userowname=FALSE) |
sep |
Character string used to separate the terms when concatenating group names into new separation character for new column names in the resulting data frame |
wide |
Boolean indicating whether to use wide format(default:FALSE) |
data.frame with subsets information and details from the user supplied data frame
Kai Guo
A <- sample(1:100, 40, replace = FALSE) B <- sample(1:100, 60, replace = FALSE) C <- sample(1:100, 40, replace = FALSE) dA <- data.frame(A = A, "FC" = rnorm(40)) dB <- data.frame(B = B, "FC" = rnorm(60)) dC <- data.frame(C = C, "FC" = rnorm(40)) res <- venndetail(list(A = A, B = B, C = C)) rhs <- getFeature(res, subset = "Shared", rlist = list(dA, dB, dC), userowname= FALSE, gind = rep(1, 3))