violinPlotD {DAPAR}R Documentation

Builds a violinplot from a dataframe

Description

Builds a violinplot from a dataframe

Usage

violinPlotD(
  obj,
  conds,
  keyId,
  legend = NULL,
  palette = NULL,
  subset.view = NULL
)

Arguments

obj

xxx

conds

xxx

keyId

xxx

legend

A vector of the conditions (one condition per sample).

palette

xxx

subset.view

xxx

Value

A violinplot

Author(s)

Samuel Wieczorek, Anais Courtier

See Also

densityPlotD

Examples

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)


[Package DAPAR version 1.22.9 Index]