nz {tofsims} | R Documentation |
nz
, slot of MassSpectra
class objectsnz
, slot of MassSpectra
class objects
nz(object, mzRange = NULL) nz(object) <- value ## S4 method for signature 'MassSpectra,missing' nz(object, mzRange = NULL) ## S4 method for signature 'MassSpectra,numeric' nz(object, mzRange = NULL) ## S4 replacement method for signature 'MassSpectra' nz(object) <- value
object |
object of class MassSpectra |
mzRange |
vector numeric mass values for nz matrix |
value |
matrix replacement values for nz |
numeric matrix, content of nz
object MassSpectra
other slots mz
analysis
analysisName
instrument
calibPoints
calibration
library(tofsimsData) data(tofsimsData) ## access main data slot nz(testSpectra)[,1:1000]