Training non default regression models

Etienne Becht

June 2020

Introduction

This vignette explains how to specify non-default machine learning frameworks and their hyperparameters when applying Infinity Flow. We will assume here that the basic usage of Infinity Flow has already been read, if you are not familiar with this material I suggest you first look at the basic usage vignette

This vignette will cover:

  1. Loading the example data
  2. Note on package design
  3. The regression_functions argument
  4. The extra_args_regression_params argument
  5. Neural networks

Loading the example data

Here is a single R code chunk that recapitulates all of the data preparation covered in the basic usage vignette.

if(!require(devtools)){
    install.packages("devtools")
}
if(!require(infinityFlow)){
    library(devtools)
    install_github("ebecht/infinityFlow")
}
library(infinityFlow)

data(steady_state_lung)
data(steady_state_lung_annotation)
data(steady_state_lung_backbone_specification)

dir <- file.path(tempdir(), "infinity_flow_example")
input_dir <- file.path(dir, "fcs")
write.flowSet(steady_state_lung, outdir = input_dir)
#> [1] "/tmp/RtmpVZ8D6f/infinity_flow_example/fcs"

write.csv(steady_state_lung_backbone_specification, file = file.path(dir, "backbone_selection_file.csv"), row.names = FALSE)

path_to_fcs <- file.path(dir, "fcs")
path_to_output <- file.path(dir, "output")
path_to_intermediary_results <- file.path(dir, "tmp")
backbone_selection_file <- file.path(dir, "backbone_selection_file.csv")

targets <- steady_state_lung_annotation$Infinity_target
names(targets) <- rownames(steady_state_lung_annotation)
isotypes <- steady_state_lung_annotation$Infinity_isotype
names(isotypes) <- rownames(steady_state_lung_annotation)

input_events_downsampling <- 1000
prediction_events_downsampling <- 500
cores = 1L

Note on package design

The infinity_flow() function which encapsulates the complete Infinity Flow computational pipeline uses two arguments to respectively select regression models and their hyperparameters. These two arguments are both lists, and should have the same length. The idea is that the first list, regression_functions will be a list of model templates (XGBoost, Neural Networks, SVMs…) to train, while the second will be used to specify their hyperparameters. The list of templates is then fit to the data using parallel computing with socketing (using the parallel package through the pbapply package), which is more memory efficient.

The regression_functions argument

This argument is a list of functions which specifies how many models to train per well and which ones. Each type of machine learning model is supported through a wrapper in the infinityFlow package, and has a name of the form fitter_*. See below for the complete list:

print(grep("fitter_", ls("package:infinityFlow"), value = TRUE))
#> [1] "fitter_glmnet"  "fitter_linear"  "fitter_nn"      "fitter_svm"    
#> [5] "fitter_xgboost"
fitter_ function Backend Model type
fitter_xgboost XGBoost Gradient boosted trees
fitter_nn Tensorflow/Keras Neural networks
fitter_svm e1071 Support vector machines
fitter_glmnet glmnet Generalized linear and polynomial models
fitter_lm stats Linear and polynomial models

These functions rely on optional package dependencies (so that you do not need to install e.g. Keras if you are not planning to use it). We need to make sure that these dependencies are however met:

       optional_dependencies <- c("glmnetUtils", "e1071")
       unmet_dependencies <- setdiff(optional_dependencies, rownames(installed.packages()))
       if(length(unmet_dependencies) > 0){
           install.packages(unmet_dependencies)
       }
       for(pkg in optional_dependencies){
           library(pkg, character.only = TRUE)
       }

In this vignette we will train all of these models. Note that if you do it on your own data, it make take quite a bit of memory (remember that the output expression matrix will be a numeric matrix of size (prediction_events_downsampling x number of wells) rows x (number of wells x number of models).

To train multiple models we create a list of these fitter_* functions and assign this to the regression_functions argument that will be fed to the infinity_flow function. The names of this list will be used to name your models.

regression_functions <- list(
    XGBoost = fitter_xgboost, # XGBoost
    SVM = fitter_svm, # SVM
    LASSO2 = fitter_glmnet, # L1-penalized 2nd degree polynomial model
    LM = fitter_linear # Linear model
)

The extra_args_regression_params argument

This argument is a list of list (so of the form list(list(...), list(...), etc.)) of length length(regression_functions). Each element of the extra_args_regression_params object is thus a list. This lower-level list will be used to pass named arguments to the machine learning fitting function. The list of extra_args_regression_params is matched with the list of machine learning models regression_functions using the order of the elements in these two lists (e.g. the first regression model is matched with the first element of the list of arguments, then the seconds elements are matched together, etc…).

backbone_size <- table(read.csv(backbone_selection_file)[,"type"])["backbone"]
extra_args_regression_params <- list(
     ## Passed to the first element of `regression_functions`, e.g. XGBoost. See ?xgboost for which parameters can be passed through this list
    list(nrounds = 500, eta = 0.05),

    # ## Passed to the second element of `regression_functions`, e.g. neural networks through keras::fit. See https://keras.rstudio.com/articles/tutorial_basic_regression.html
    # list(
    #         object = { ## Specifies the network's architecture, loss function and optimization method
    #             model = keras_model_sequential()
    #             model %>%
    #                 layer_dense(units = backbone_size, activation = "relu", input_shape = backbone_size) %>%
    #                 layer_dense(units = backbone_size, activation = "relu", input_shape = backbone_size) %>%
    #                 layer_dense(units = 1, activation = "linear")
    #             model %>%
    #                 compile(loss = "mean_squared_error", optimizer = optimizer_sgd(lr = 0.005))
    #             serialize_model(model)
    #         },
    #         epochs = 1000, ## Number of maximum training epochs. The training is however stopped early if the loss on the validation set does not improve for 20 epochs. This early stopping is hardcoded in fitter_nn.
    #         validation_split = 0.2, ## Fraction of the training data used to monitor validation loss
    #         verbose = 0,
    #         batch_size = 128 ## Size of the minibatches for training.
    # ),

    # Passed to the third element, SVMs. See help(svm, "e1071") for possible arguments
    list(type = "nu-regression", cost = 8, nu=0.5, kernel="radial"),

    # Passed to the fourth element, fitter_glmnet. This should contain a mandatory argument `degree` which specifies the degree of the polynomial model (1 for linear, 2 for quadratic etc...). Here we use degree = 2 corresponding to our LASSO2 model Other arguments are passed to getS3method("cv.glmnet", "formula"),
    list(alpha = 1, nfolds=10, degree = 2),

    # Passed to the fourth element, fitter_linear. This only accepts a degree argument specifying the degree of the polynomial model. Here we use degree = 1 corresponding to a linear model.
    list(degree = 1)
)

We can now run the pipeline with these custom arguments to train all the models.

if(length(regression_functions) != length(extra_args_regression_params)){
    stop("Number of models and number of lists of hyperparameters mismatch")
}
imputed_data <- infinity_flow(
    regression_functions = regression_functions,
    extra_args_regression_params = extra_args_regression_params,
    path_to_fcs = path_to_fcs,
    path_to_output = path_to_output,
    path_to_intermediary_results = path_to_intermediary_results,
    backbone_selection_file = backbone_selection_file,
    annotation = targets,
    isotype = isotypes,
    input_events_downsampling = input_events_downsampling,
    prediction_events_downsampling = prediction_events_downsampling,
    verbose = TRUE,
    cores = cores
)
#> Using directories...
#>  input: /tmp/RtmpVZ8D6f/infinity_flow_example/fcs
#>  intermediary: /tmp/RtmpVZ8D6f/infinity_flow_example/tmp
#>  subset: /tmp/RtmpVZ8D6f/infinity_flow_example/tmp/subsetted_fcs
#>  rds: /tmp/RtmpVZ8D6f/infinity_flow_example/tmp/rds
#>  annotation: /tmp/RtmpVZ8D6f/infinity_flow_example/tmp/annotation.csv
#>  output: /tmp/RtmpVZ8D6f/infinity_flow_example/output
#> Parsing and subsampling input data
#>  Downsampling to 1000 events per input file
#>  Concatenating expression matrices
#>  Writing to disk
#> Logicle-transforming the data
#>  Backbone data
#>  Exploratory data
#>  Writing to disk
#>  Transforming expression matrix
#>  Writing to disk
#> Harmonizing backbone data
#>  Scaling expression matrices
#>  Writing to disk
#> Fitting regression models
#>  Randomly selecting 50% of the subsetted input files to fit models
#>  Fitting...
#>      XGBoost
#> 
#>  11.8028 seconds
#>      SVM
#> 
#>  0.9390836 seconds
#>      LASSO2
#> 
#>  8.308765 seconds
#>      LM
#> 
#>  0.06567645 seconds
#> Imputing missing measurements
#>  Randomly drawing events to predict from the test set
#>  Imputing...
#>      XGBoost
#> 
#>  0.9253006 seconds
#>      SVM
#> 
#>  1.389627 seconds
#>      LASSO2
#> 
#>  0.8303201 seconds
#>      LM
#> 
#>  0.04466748 seconds
#>  Concatenating predictions
#>  Writing to disk
#> Performing dimensionality reduction
#> 17:33:57 UMAP embedding parameters a = 1.262 b = 1.003
#> 17:33:57 Read 5000 rows and found 17 numeric columns
#> 17:33:57 Using Annoy for neighbor search, n_neighbors = 15
#> 17:33:57 Building Annoy index with metric = euclidean, n_trees = 50
#> 0%   10   20   30   40   50   60   70   80   90   100%
#> [----|----|----|----|----|----|----|----|----|----|
#> **************************************************|
#> 17:33:58 Writing NN index file to temp file /tmp/RtmpVZ8D6f/file2df69a559a36ea
#> 17:33:58 Searching Annoy index using 1 thread, search_k = 1500
#> 17:33:59 Annoy recall = 100%
#> 17:33:59 Commencing smooth kNN distance calibration using 1 thread with target n_neighbors = 15
#> 17:34:00 Initializing from normalized Laplacian + noise (using irlba)
#> 17:34:00 Commencing optimization for 1000 epochs, with 102494 positive edges using 1 thread
#> 17:34:10 Optimization finished
#> Exporting results
#>  Transforming predictions back to a linear scale
#>  Exporting FCS files (1 per well)
#> Plotting
#>  Chopping off the top and bottom 0.005 quantiles
#>  Shuffling the order of cells (rows)
#>  Producing plot
#> Background correcting
#>  Transforming background-corrected predictions. (Use logarithm to visualize)
#>  Exporting FCS files (1 per well)
#> Plotting
#>  Chopping off the top and bottom 0.005 quantiles
#>  Shuffling the order of cells (rows)
#>  Producing plot

Our model names are appended to the predicted markers in the output. For more discussion about the outputs (including output files written to disk and plots), see the basic usage vignette

   print(imputed_data$bgc[1:2, ])
#>      FSC-A       FSC-H      FSC-W   SSC-A      SSC-H      SSC-W CD69-CD301b
#> 2 42699.96 -0.57392959 -0.5493886 2580.14 -0.6896031 -0.9199824  -0.8902764
#> 4 51080.01  0.06647304 -0.6398837 3866.26 -0.1396236 -0.5074400   0.1777663
#>      Zombie     MHCII        CD4       CD44         CD8      CD11c       CD11b
#> 2 -23.56643 0.6734309 -0.3694785 -0.1215797 -0.62228633 -2.1998824 -0.02054978
#> 4 107.20619 0.1015021  0.2894948  0.6761221 -0.05952063  0.3200378  1.61266172
#>         F480       Ly6C      Lineage  CD45a488 FJComp-PE(yg)-A      CD24
#> 2 -0.7026025 -1.2815885  0.003566671 0.2406449       0.5479772 0.6441301
#> 4  0.7992825  0.6514918 -0.837062660 0.5019326       1.4564637 0.5201736
#>        CD103      Time CD137.LASSO2_bgc CD137.LM_bgc CD137.SVM_bgc
#> 2 -0.7637229  841.1022       -0.2644499   -0.4412747    -0.4680641
#> 4  0.3169245 3024.6079        0.2243642    0.1427944     0.6710295
#>   CD137.XGBoost_bgc CD28.LASSO2_bgc CD28.LM_bgc CD28.SVM_bgc CD28.XGBoost_bgc
#> 2        -1.1592558     -0.07418999 -0.04007225   -0.3623602        0.1338070
#> 4        -0.1774666     -0.16821630  0.04322758   -0.3480269        0.3475219
#>   CD49b(pan-NK).LASSO2_bgc CD49b(pan-NK).LM_bgc CD49b(pan-NK).SVM_bgc
#> 2               -0.1690166           -0.4553822            -0.6818303
#> 4               -0.4246490           -0.3224420            -0.7975505
#>   CD49b(pan-NK).XGBoost_bgc KLRG1.LASSO2_bgc KLRG1.LM_bgc KLRG1.SVM_bgc
#> 2                -1.0473371       -0.4068105 -0.318769108    -1.2135341
#> 4                -0.4905503       -0.1266953  0.007399448    -0.5401336
#>   KLRG1.XGBoost_bgc Ly-49c/F/I/H.LASSO2_bgc Ly-49c/F/I/H.LM_bgc
#> 2        -0.4982053             -0.18038280          -0.2031183
#> 4         0.3145670              0.09357924           0.1556379
#>   Ly-49c/F/I/H.SVM_bgc Ly-49c/F/I/H.XGBoost_bgc Podoplanin.LASSO2_bgc
#> 2          -0.31942412               -0.2556907            -0.4857807
#> 4          -0.04380765                0.5190321            -0.1218927
#>   Podoplanin.LM_bgc Podoplanin.SVM_bgc Podoplanin.XGBoost_bgc SHIgG.LASSO2_bgc
#> 2        -0.6236060         -0.6807812             -0.7734051    -2.624180e-16
#> 4        -0.0900138         -0.2575002              0.1048739    -5.764364e-16
#>   SHIgG.LM_bgc SHIgG.SVM_bgc SHIgG.XGBoost_bgc SSEA-3.LASSO2_bgc SSEA-3.LM_bgc
#> 2 4.194272e-16  6.760505e-17      7.792516e-16       -0.03059782    -0.1831196
#> 4 5.764364e-16  4.601282e-16      1.878316e-15        0.07481628    -0.1788163
#>   SSEA-3.SVM_bgc SSEA-3.XGBoost_bgc TCR Vg3.LASSO2_bgc TCR Vg3.LM_bgc
#> 2    -0.06140694        -0.01878367         -0.2485536    -0.24424552
#> 4    -0.13512374         0.38964510         -0.1507337    -0.02257811
#>   TCR Vg3.SVM_bgc TCR Vg3.XGBoost_bgc rIgM.LASSO2_bgc  rIgM.LM_bgc
#> 2      -0.9754091          -0.5699821    5.317344e-16 4.870323e-16
#> 4      -0.1356455           0.7893120    3.747251e-16 1.730138e-16
#>    rIgM.SVM_bgc rIgM.XGBoost_bgc     UMAP1    UMAP2 PE_id
#> 2 -3.667228e-16    -2.682126e-16  20.08525 764.2081     1
#> 4 -2.097136e-16     2.028152e-16 309.03477 546.9822     1

Neural networks

Neural networks won’t build in knitr for me but here is an example of the syntax if you want to use them.

Note: there is an issue with serialization of the neural networks and socketing since I updated to R-4.0.1. If you want to use neural networks, please make sure to set

cores = 1L
optional_dependencies <- c("keras", "tensorflow")
unmet_dependencies <- setdiff(optional_dependencies, rownames(installed.packages()))
if(length(unmet_dependencies) > 0){
     install.packages(unmet_dependencies)
}
for(pkg in optional_dependencies){
    library(pkg, character.only = TRUE)
}

invisible(eval(try(keras_model_sequential()))) ## avoids conflicts with flowCore...

if(!is_keras_available()){
     install_keras() ## Instal keras unsing the R interface - can take a while
}

if (!requireNamespace("BiocManager", quietly = TRUE)){
    install.packages("BiocManager")
}
BiocManager::install("infinityFlow")

library(infinityFlow)

data(steady_state_lung)
data(steady_state_lung_annotation)
data(steady_state_lung_backbone_specification)

dir <- file.path(tempdir(), "infinity_flow_example")
input_dir <- file.path(dir, "fcs")
write.flowSet(steady_state_lung, outdir = input_dir)

write.csv(steady_state_lung_backbone_specification, file = file.path(dir, "backbone_selection_file.csv"), row.names = FALSE)

path_to_fcs <- file.path(dir, "fcs")
path_to_output <- file.path(dir, "output")
path_to_intermediary_results <- file.path(dir, "tmp")
backbone_selection_file <- file.path(dir, "backbone_selection_file.csv")

targets <- steady_state_lung_annotation$Infinity_target
names(targets) <- rownames(steady_state_lung_annotation)
isotypes <- steady_state_lung_annotation$Infinity_isotype
names(isotypes) <- rownames(steady_state_lung_annotation)

input_events_downsampling <- 1000
prediction_events_downsampling <- 500

## Passed to fitter_nn, e.g. neural networks through keras::fit. See https://keras.rstudio.com/articles/tutorial_basic_regression.html
regression_functions <- list(NN = fitter_nn)

backbone_size <- table(read.csv(backbone_selection_file)[,"type"])["backbone"]
extra_args_regression_params <- list(
        list(
        object = { ## Specifies the network's architecture, loss function and optimization method
        model = keras_model_sequential()
        model %>%
        layer_dense(units = backbone_size, activation = "relu", input_shape = backbone_size) %>% 
        layer_dense(units = backbone_size, activation = "relu", input_shape = backbone_size) %>%
        layer_dense(units = 1, activation = "linear")
        model %>%
        compile(loss = "mean_squared_error", optimizer = optimizer_sgd(lr = 0.005))
        serialize_model(model)
        },
        epochs = 1000, ## Number of maximum training epochs. The training is however stopped early if the loss on the validation set does not improve for 20 epochs. This early stopping is hardcoded in fitter_nn.
        validation_split = 0.2, ## Fraction of the training data used to monitor validation loss
        verbose = 0,
        batch_size = 128 ## Size of the minibatches for training.
    )
)

imputed_data <- infinity_flow(
    regression_functions = regression_functions,
    extra_args_regression_params = extra_args_regression_params,
    path_to_fcs = path_to_fcs,
    path_to_output = path_to_output,
    path_to_intermediary_results = path_to_intermediary_results,
    backbone_selection_file = backbone_selection_file,
    annotation = targets,
    isotype = isotypes,
    input_events_downsampling = input_events_downsampling,
    prediction_events_downsampling = prediction_events_downsampling,
    verbose = TRUE,
    cores = 1L
)

Conclusion

Thank you for following this vignette, I hope you made it through the end without too much headache and that it was informative. General questions about proper usage of the package are best asked on the Bioconductor support site to maximize visibility for future users. If you encounter bugs, feel free to raise an issue on infinityFlow’s github.

Information about the R session when this vignette was built

sessionInfo()
#> R Under development (unstable) (2023-11-11 r85510)
#> 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
#> 
#> Random number generation:
#>  RNG:     L'Ecuyer-CMRG 
#>  Normal:  Inversion 
#>  Sample:  Rejection 
#>  
#> 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] e1071_1.7-14        glmnetUtils_1.1.9   infinityFlow_1.13.1
#> [4] flowCore_2.15.1    
#> 
#> loaded via a namespace (and not attached):
#>  [1] sass_0.4.8          generics_0.1.3      class_7.3-22       
#>  [4] gtools_3.9.5        shape_1.4.6         lattice_0.22-5     
#>  [7] digest_0.6.34       evaluate_0.23       grid_4.4.0         
#> [10] iterators_1.0.14    fastmap_1.1.1       xgboost_1.7.6.1    
#> [13] foreach_1.5.2       jsonlite_1.8.8      Matrix_1.6-5       
#> [16] glmnet_4.1-8        survival_3.5-7      pbapply_1.7-2      
#> [19] codetools_0.2-19    jquerylib_0.1.4     cli_3.6.2          
#> [22] rlang_1.1.3         RProtoBufLib_2.15.0 Biobase_2.63.0     
#> [25] RcppAnnoy_0.0.21    uwot_0.1.16         matlab_1.0.4       
#> [28] splines_4.4.0       cachem_1.0.8        yaml_2.3.8         
#> [31] cytolib_2.15.1      tools_4.4.0         raster_3.6-26      
#> [34] parallel_4.4.0      BiocGenerics_0.49.1 R6_2.5.1           
#> [37] png_0.1-8           proxy_0.4-27        matrixStats_1.2.0  
#> [40] stats4_4.4.0        lifecycle_1.0.4     S4Vectors_0.41.3   
#> [43] irlba_2.3.5.1       terra_1.7-65        bslib_0.6.1        
#> [46] data.table_1.14.10  Rcpp_1.0.12         xfun_0.41          
#> [49] knitr_1.45          htmltools_0.5.7     rmarkdown_2.25     
#> [52] compiler_4.4.0      sp_2.1-2