calibration {tofsims} | R Documentation |
calibration
, slot of MassSpectra
class objectscalibration
, slot of MassSpectra
class objects
Generic setter for slot calibration<-
calibration(object) calibration(object) <- value ## S4 method for signature 'MassSpectra' calibration(object) ## S4 replacement method for signature 'MassSpectra' calibration(object) <- value
object |
object of class MassSpectra |
value |
data.frame with replacement values for calibration slot |
content of calibration slot
object MassSpectra
other slots mz
analysis
analysisName
instrument
calibPoints
nz
library(tofsimsData) data(tofsimsData) ## access calibration slot calibration(testSpectra) ## replacing the values of the 'calibration' slot is ## possible but it makes at the moment no sense as it ## doesn't change the actual mass calibration. The ## 'calibration' slot is just used to store the values ## while 'recalibration' uses the values from ## 'calibPoints' slot. calibration(testSpectra) <- data.frame(intercept = 21420, slope = 20480) calibration(testSpectra)