setBins {flowPloidy} | R Documentation |
(Re-)set the bins for a FlowHist object
setBins(fh, bins = 256)
fh |
a |
bins |
integer, the number of bins to use in aggregating FCS data |
This function sets (or resets) the number of bins to use in aggregating FCS data into a histogram, and generates the corresponding data matrix. Not exported for general use.
The histData
matrix also contains the columns corresponding to
the raw data used in calculating the single-cut and multiple-cut debris
components, as well as the doublet, triplet, and quadruplet aggregate
values. (i.e., SCvals
, MCvals
, DBvals
,
TRvals
, and QDvals
).
setBins
includes a call to resetFlowHist
, so
all the model components that depend on the bins are updated in the
process (as you want!).
a FlowHist
object, with the bins
slot set
to bins
, and the corresonding binned data stored in a matrix in
the histData
slot. Any previous analysis slots are removed:
peaks, comps, model, init, nls, counts, CV, RCS
.
Tyler Smith
## defaults to 256 bins: library(flowPloidyData) fh1 <- FlowHist(file = flowPloidyFiles[1], channel = "FL3.INT.LIN") plot(fh1) ## reset them to 512 bins: fh1 <- setBins(fh1, 512) plot(fh1)