panel.xyplot.flowPlate {plateCore} | R Documentation |
This function should not be called directly, use xyplot
.
panel.xyplot.flowPlate(x, frames, channel.x, channel.y, channel.x.name, channel.y.name, filter = NULL, filterResults = NULL, displayFilter = TRUE, pch, smooth, wellAnnotation = NULL, col = superpose.symbol$col, ...)
x |
character |
frames |
flowFrames |
channel.x |
xyplot channel.x parameter |
channel.y |
xyplot channel.y parameter |
channel.x.name |
xyplot channel.x.name parameter |
channel.y.name |
xyplot channel.y.name parameter |
filter |
xyplot filter parameter |
filterResults |
xyplot filterResults parameter |
displayFilter |
xyplot displayFilter parameter |
pch |
xyplot pch parameter |
smooth |
xyplot smooth parameter |
wellAnnotation |
wellAnnotation data.frame |
col |
xyplot col parameter |
... |
optional arguments |
Errol Strain
See Also xyplot
library(plateCore) data(plateCore) # Create a flowPlate from the sample data in plateCore fp <- flowPlate(pbmcPlate,wellAnnotation,plateName="P1") ## Create a rectangle filter rectGate <- rectangleGate("FSC-H"=c(300,700),"SSC-H"=c(50,400)) xyplot(`SSC-H` ~ `FSC-H` | as.factor(name), fp[1], smooth=FALSE, filter=rectGate, displayFilter=FALSE)