violinPlotD {DAPAR} | R Documentation |
Builds a violinplot from a dataframe
violinPlotD( obj, conds, keyId, legend = NULL, palette = NULL, subset.view = NULL )
obj |
xxx |
conds |
xxx |
keyId |
xxx |
legend |
A vector of the conditions (one condition per sample). |
palette |
xxx |
subset.view |
xxx |
A violinplot
Samuel Wieczorek, Anais Courtier
utils::data(Exp1_R25_prot, package='DAPARdata') obj <- Exp1_R25_prot library(vioplot) legend <- conds <- Biobase::pData(obj)$Condition key <- "Protein_IDs" violinPlotD(obj, conds=legend, keyId=key, legend=legend, palette=c(rep('blue',3), rep('green',3)),subset.view=1:10)