applyFNErrors {simulatorAPMS} | R Documentation |
This function generates the stochastic False Negative (FN) observations for each bait protein used in the AP-MS simulation.
applyFNErrors(foundPrey, rateFN)
foundPrey |
A character vector of proteins. |
rateFN |
A scalar within the unit interval indicating the rate at which stochastic FN obersevations are observed. |
This function tries to simulate the stochastic nature of the AP-MS
technology. The overall simulation function,
runSimulators
, will call the simulator
function on each bait protein along with some uniform random rate
at which the technology is estimated to generate FN observations.
A character vector, proteinFN:
The proteinsFN is a vector consisting of a subset of the foundPrey
proteins which will serve as the FN observations for bait protein B.
T. Chiang
applyFPErrors
,applyDeformationError
library(simulatorAPMS) data(TSNMatrix) exampleFoundPrey <- rownames(TSNMatrix)[1:50] applyFNErrors(exampleFoundPrey, 0.3)