Public Data Integration using Sfaira

Alexander Dietrich

library(SimBu)

Sfaira Integeration

This vignette will cover the integration of the public database Sfaria.

Setup

As a public database, sfaira (Fischer et al. 2020) is used, which is a dataset and model repository for single-cell RNA-sequencing data. It gives access to about multiple datasets from human and mouse with more than 3 million cells in total. You can browse them interactively here: https://theislab.github.io/sfaira-portal/Datasets. Note that only annotated datasets will be downloaded! Also there are cases of datasets, which have private URLs and cannot be automatically downloaded; SimBu will skip these datasets.
In order to use this database, we first need to install it. This can easily be done, by running the setup_sfaira() function for the first time. In the background we use the basilisik package to establish a conda environment that has all sfaira dependencies installed. The installation will be only performed one single time, even if you close your R session and call setup_sfaira() again. The given directory serves as the storage for all future downloaded datasets from sfaira:

setup_list <- SimBu::setup_sfaira(basedir = tempdir())

Creating a dataset

We will now create a dataset of samples from human pancreas using the organisms and tissues parameter. You can provide a single word (like we do here) or for example a list of tissues you want to download: c("pancreas","lung"). An additional parameter is the assays parameter, where you subset the database further to only download datasets from certain sequencing assays (for examples Smart-seq2).
The name parameter is used later on to give each sample (cell) a unique name.

ds_pancrease <- SimBu::dataset_sfaira_multiple(
  sfaira_setup = setup_list,
  organisms = "Homo sapiens",
  tissues = "pancreas",
  name = "human_pancreas"
)

Currently there are three datasets in sfaira from human pancreas, which have cell-type annotation. The package will download them for you automatically and merge them together into a single expression matrix and a streamlined annotation table, which we can use for our simulation.
It can happen, that some datasets from sfaira are not (yet) ready for the automatic download, an error message will then appear in R, telling you which file to download and where to put it.

If you wish to see all datasets which are included in sfaira you can use the following command:

all_datasets <- SimBu::sfaira_overview(setup_list = setup_list)
head(all_datasets)

This allows you to find the specific IDs of datasets, which you can download directly:

SimBu::dataset_sfaira(
  sfaira_id = "homosapiens_lungparenchyma_2019_10x3v2_madissoon_001_10.1186/s13059-019-1906-x",
  sfaira_setup = setup_list,
  name = "dataset_by_id"
)
utils::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
#> 
#> 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] SimBu_1.5.4
#> 
#> loaded via a namespace (and not attached):
#>  [1] SummarizedExperiment_1.33.1 gtable_0.3.4               
#>  [3] xfun_0.41                   bslib_0.6.1                
#>  [5] ggplot2_3.4.4               Biobase_2.63.0             
#>  [7] lattice_0.22-5              vctrs_0.6.5                
#>  [9] tools_4.4.0                 bitops_1.0-7               
#> [11] generics_0.1.3              stats4_4.4.0               
#> [13] parallel_4.4.0              tibble_3.2.1               
#> [15] fansi_1.0.6                 highr_0.10                 
#> [17] pkgconfig_2.0.3             Matrix_1.6-4               
#> [19] data.table_1.14.10          RColorBrewer_1.1-3         
#> [21] S4Vectors_0.41.2            sparseMatrixStats_1.15.0   
#> [23] RcppParallel_5.1.7          lifecycle_1.0.4            
#> [25] GenomeInfoDbData_1.2.11     farver_2.1.1               
#> [27] compiler_4.4.0              munsell_0.5.0              
#> [29] codetools_0.2-19            GenomeInfoDb_1.39.3        
#> [31] htmltools_0.5.7             sass_0.4.8                 
#> [33] RCurl_1.98-1.13             yaml_2.3.8                 
#> [35] pillar_1.9.0                crayon_1.5.2               
#> [37] jquerylib_0.1.4             tidyr_1.3.0                
#> [39] BiocParallel_1.37.0         DelayedArray_0.29.0        
#> [41] cachem_1.0.8                abind_1.4-5                
#> [43] tidyselect_1.2.0            digest_0.6.33              
#> [45] dplyr_1.1.4                 purrr_1.0.2                
#> [47] labeling_0.4.3              fastmap_1.1.1              
#> [49] grid_4.4.0                  colorspace_2.1-0           
#> [51] cli_3.6.2                   SparseArray_1.3.1          
#> [53] magrittr_2.0.3              S4Arrays_1.3.1             
#> [55] utf8_1.2.4                  withr_2.5.2                
#> [57] scales_1.3.0                rmarkdown_2.25             
#> [59] XVector_0.43.0              matrixStats_1.2.0          
#> [61] proxyC_0.3.4                evaluate_0.23              
#> [63] knitr_1.45                  GenomicRanges_1.55.1       
#> [65] IRanges_2.37.0              rlang_1.1.2                
#> [67] Rcpp_1.0.11                 glue_1.6.2                 
#> [69] BiocGenerics_0.49.1         jsonlite_1.8.8             
#> [71] R6_2.5.1                    MatrixGenerics_1.15.0      
#> [73] zlibbioc_1.49.0

Fischer, David S., Leander Dony, Martin König, Abdul Moeed, Luke Zappia, Sophie Tritschler, Olle Holmberg, Hananeh Aliee, and Fabian J. Theis. 2020. “Sfaira Accelerates Data and Model Reuse in Single Cell Genomics.” bioRxiv. https://doi.org/10.1101/2020.12.16.419036.