Contents

1 Version Info

R version: R Under development (unstable) (2023-10-22 r85388)
Bioconductor version: 3.19
Package version: 1.27.0

2 Sample Workflow

The following psuedo-code illustrates a typical R / Bioconductor session. It makes use of the flow cytometry packages to load, transform and visualize the flow data and gate certain populations in the dataset.

The workflow loads the flowCore, flowStats and flowWorkspace packages and its dependencies. It loads the ITN data with 15 samples, each of which includes, in addition to FSC and SSC, 5 fluorescence channels: CD3, CD4, CD8, CD69 and HLADR.

## Load packages
library(flowCore)
library(flowStats)
library(flowWorkspace)
library(ggcyto)
library(scales)

## Load data
data(ITN)
ITN
## A flowSet with 15 experiments.
## 
## An object of class 'AnnotatedDataFrame'
##   rowNames: sample01 sample02 ... sample15 (15 total)
##   varLabels: GroupID SiteCode ... name (7 total)
##   varMetadata: labelDescription
## 
## column names(8): FSC SSC ... HLADr Time

First, we need to transform all the fluorescence channels. Using a GatingSet object can help to keep track of our progress.

## Create a workflow instance and transform data using asinh
gs <- GatingSet(ITN)
trans.obj <- trans_new("myAsinh", transform=asinh, inverse=sinh)
tl <- transformerList(colnames(ITN)[3:7], trans.obj)
gs <- transform(gs, tl)

Next we use the lymphGate function to find the T-cells in the CD3/SSC projection.

## Identify T-cells population
lg <- lymphGate(gs_cyto_data(gs), channels=c("CD3", "SSC"),
                preselection="CD4", filterId="TCells",
                scale=2.5)
gs_pop_add(gs, lg)
## [1] 2
recompute(gs)
## done!
ggcyto(gs, aes(x = CD3, y = SSC)) + geom_hex(bins = 32) + geom_gate("TCells")

A typical workflow for flow cytometry data analysis in Bioconductor flow packages include data transformation, normalization, filtering, manual gating, semi-automatic gating and automatic clustering if desired. Details can be found in flowWorkFlow.pdf or the vignettes of the flow cytometry packages.

[ Back to top ]

3 Installation and Use

Follow installation instructions to start using these packages. To install the flowCore package and all of its dependencies, evaluate the commands

if (!"BiocManager" %in% rownames(installed.packages()))
     install.packages("BiocManager")
BiocManager::install("flowCore")

Package installation is required only once per R installation. View a full list of available packages.

To use the flowCore package, evaluate the command

library("flowCore")

This instruction is required once in each R session.

[ Back to top ]

4 Exploring Package Content

Packages have extensive help pages, and include vignettes highlighting common use cases. The help pages and vignettes are available from within R. After loading a package, use syntax like

help(package="flowCore")
?read.FCS

to obtain an overview of help on the flowCore package, and the read.FCS function, and

browseVignettes(package="flowCore")

to view vignettes (providing a more comprehensive introduction to package functionality) in the flowCore package. Use

help.start()

to open a web page containing comprehensive help resources.

[ Back to top ]

5 Diverse Assays Resources

The following provide a brief overview of packages useful for analysis of high-throughput assays. More comprehensive workflows can be found in documentation (available from package descriptions) and in Bioconductor publications.

5.1 Flow Cytometry

These packages use standard FCS files, including infrastructure, utilities, visualization and semi-autogating methods for the analysis of flow cytometry data.

flowCore, flowViz, flowQ, flowStats, flowUtils, flowFP, flowTrans,

Algorithms for clustering flow cytometry data are found in these packages:

flowClust, flowMeans, flowMerge, SamSPECTRAL

A typical workflow using the packages flowCore, flowViz, flowQ and flowStats is described in detail in flowWorkFlow.pdf. The data files used in the workflow can be downloaded from here.

5.2 Cell-based Assays

These packages provide data structures and algorithms for cell-based high-throughput screens (HTS).

cellHTS2, RNAither

This package supports the xCELLigence system which contains a series of real-time cell analyzer (RTCA).

RTCA

5.3 High-throughput qPCR Assays

These package provide algorithm for the analysis of cycle threshold (Ct) from quantitative real-time PCR data.

HTqPCR, ddCt, qpcrNorm

5.4 Mass Spectrometry and Proteomics data

These packages provide framework for processing, visualization, and statistical analysis of mass spectral and proteomics data.

clippda, MassArray, MassSpecWavelet, PROcess, flagme, xcms

5.5 Imaging Based Assays

These packages provide infrastructure for image-based phenotyping and automation of other image-related tasks:

EBImage, imageHTS

[ Back to top ]

sessionInfo()
## R Under development (unstable) (2023-10-22 r85388)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.19-bioc/R/lib/libRblas.so 
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.10.0
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_GB              LC_COLLATE=C              
##  [5] LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8   
##  [7] LC_PAPER=en_US.UTF-8       LC_NAME=C                 
##  [9] LC_ADDRESS=C               LC_TELEPHONE=C            
## [11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
##  [1] scales_1.2.1                ggcyto_1.31.0              
##  [3] ncdfFlow_2.49.0             BH_1.81.0-1                
##  [5] ggplot2_3.4.4               highthroughputassays_1.27.0
##  [7] flowWorkspace_4.15.0        flowStats_4.15.0           
##  [9] flowCore_2.15.0             BiocStyle_2.31.0           
## 
## loaded via a namespace (and not attached):
##  [1] tidyselect_1.2.0    hdrcde_3.4          farver_2.1.1       
##  [4] dplyr_1.1.3         bitops_1.0-7        fastmap_1.1.1      
##  [7] RCurl_1.98-1.12     pracma_2.4.2        XML_3.99-0.14      
## [10] digest_0.6.33       lifecycle_1.0.3     cluster_2.1.4      
## [13] magrittr_2.0.3      compiler_4.4.0      rlang_1.1.1        
## [16] sass_0.4.7          tools_4.4.0         utf8_1.2.4         
## [19] yaml_2.3.7          data.table_1.14.8   knitr_1.44         
## [22] rrcov_1.7-4         labeling_0.4.3      interp_1.1-4       
## [25] mclust_6.0.0        mnormt_2.1.1        plyr_1.8.9         
## [28] RColorBrewer_1.1-3  rainbow_3.7         KernSmooth_2.23-22 
## [31] fda_6.1.4           withr_2.5.1         RProtoBufLib_2.15.0
## [34] BiocGenerics_0.49.0 grid_4.4.0          pcaPP_2.0-3        
## [37] stats4_4.4.0        fansi_1.0.5         latticeExtra_0.6-30
## [40] colorspace_2.1-0    MASS_7.3-60.1       cli_3.6.1          
## [43] mvtnorm_1.2-3       rmarkdown_2.25      generics_0.1.3     
## [46] robustbase_0.99-0   IDPmisc_1.1.20      fds_1.8            
## [49] cachem_1.0.8        zlibbioc_1.49.0     splines_4.4.0      
## [52] parallel_4.4.0      BiocManager_1.30.22 matrixStats_1.0.0  
## [55] vctrs_0.6.4         Matrix_1.6-1.1      jsonlite_1.8.7     
## [58] cytolib_2.15.0      bookdown_0.36       S4Vectors_0.41.0   
## [61] clue_0.3-65         Rgraphviz_2.47.0    magick_2.8.1       
## [64] jpeg_0.1-10         jquerylib_0.1.4     hexbin_1.28.3      
## [67] glue_1.6.2          DEoptimR_1.1-3      gtable_0.3.4       
## [70] deldir_1.0-9        munsell_0.5.0       tibble_3.2.1       
## [73] pillar_1.9.0        htmltools_0.5.6.1   graph_1.81.0       
## [76] deSolve_1.38        R6_2.5.1            ks_1.14.1          
## [79] evaluate_0.22       lattice_0.22-5      Biobase_2.63.0     
## [82] png_0.1-8           flowViz_1.67.0      corpcor_1.6.10     
## [85] bslib_0.5.1         Rcpp_1.0.11         gridExtra_2.3      
## [88] xfun_0.40           pkgconfig_2.0.3

[ Back to top ]