peakPick {tofsims} | R Documentation |
method peakPick
peakPick(object, span = 100, ...) ## S4 method for signature 'MassSpectra' peakPick(object, span = 100, ...)
object |
object of class MassSpectra |
span |
numeric parameter for local max/min detection |
... |
additional args |
Method peakPick for MassSpectra class, works as a constructor for PeakList class. The local min/max detection implementation is adapted from the CRAN package 'alsace'.
object of class PeakList with updated slots PeakIDs and peakMzs
object of class PeakList
library(tofsimsData) data(tofsimsData) testSpectra <- reduceSpectrumResolution(object = testSpectra, everyN = 4, mode = 'keep') testSpectra <- smootherSpline(testSpectra, stepsize = 10, spar = 0.3) testSpectra <- smootherGolay(testSpectra, p = 3, n = 5) testSpectra <- peakPick(testSpectra, span = 100) plot(testSpectra, , mzRange=c(38.5,40.5), type = 'l')