library(flowStats)
## Loading required package: flowCore
## Loading required package: fda
## Loading required package: splines
## Loading required package: Matrix
##
## Attaching package: 'Matrix'
##
## The following object is masked from 'package:flowCore':
##
## %&%
##
##
## Attaching package: 'fda'
##
## The following object is masked from 'package:graphics':
##
## matplot
##
## Loading required package: mvoutlier
## Loading required package: sgeostat
## Loading required package: cluster
## Loading required package: flowWorkspace
## Loading required package: flowViz
## Loading required package: lattice
## Loading required package: ncdfFlow
## Loading required package: RcppArmadillo
## Loading required package: BH
## Loading required package: gridExtra
data("GvHD")
filt_subset <- GvHD[1]
g <- lymphGate(filt_subset, channels = c("FSC-H","SSC-H"), preselection=NULL, scale = 1.5, bwFac = 1.3, filterId = "defaultLymphGate")
output <- Subset(filt_subset, g$n2gate)
grid.arrange(
xyplot(`FSC-H`~`SSC-H`, output)
,xyplot(`FSC-H`~`SSC-H`, filt_subset, filter = g$n2gate)
)
