| tpp2dCalcFractAbundance {TPP} | R Documentation |
Calculates fractional abundance and DMSO ratio of successive sumionareas and creates respective columns which are added two the data frame which is handed over
tpp2dCalcFractAbundance(configTable = NULL, data, intensityStr = NULL, idVar = NULL)
configTable |
DEPCRECATED |
data |
data frame of TPP-CCR results (e.g. obtained by |
intensityStr |
DEPCRECATED |
idVar |
DEPCRECATED |
Data frame that was handed over with additional columns of fractional abundance and DMSO1 vs DMSO2 ratio
data(panobinostat_2DTPP_smallExample)
# Import data:
datIn <- tpp2dImport(configTable = panobinostat_2DTPP_config,
data = panobinostat_2DTPP_data,
idVar = "representative",
addCol = "clustername",
intensityStr = "sumionarea_protein_",
nonZeroCols = "qusm")
# View attributes of imported data (experiment infos and import arguments):
attr(datIn, "importSettings") %>% unlist
attr(datIn, "configTable")
# Compute fractional abundance:
datDMSORatio <- tpp2dCalcFractAbundance(data = datIn)
colnames(datDMSORatio)