Contents

1 Motivation

The DropletTestFiles package contains files for testing droplet-based utilities, such as those in the DropletUtils package. These files are literally the raw output of pipelines like 10X Genomics’ CellRanger software suite, and are usually not in an (immediately) analysis-ready state. After all, the idea is to provide some material to test the utilities to get to such a state!

2 Functions

This package doesn’t do anything except pull down and serve up files, so there’s not much to talk about here. There are two convenience functions to help obtain content from ExperimentHub. The first is to list all available resources managed by DropletTestFiles:

library(DropletTestFiles)
out <- listTestFiles()
out
## DataFrame with 52 rows and 18 columns
##                         title       dataprovider      species taxonomyid
##                   <character>        <character>  <character>  <integer>
## EH3685 10X brain nuclei 1k ..       10X Genomics Mus musculus      10090
## EH3686 10X brain nuclei 1k ..       10X Genomics Mus musculus      10090
## EH3687 10X brain nuclei 1k ..       10X Genomics Mus musculus      10090
## EH3688 10X brain nuclei 1k ..       10X Genomics Mus musculus      10090
## EH3689 10X brain nuclei 1k ..       10X Genomics Mus musculus      10090
## ...                       ...                ...          ...        ...
## EH3732 HiSeq 4000-sequenced.. Jonathan Griffiths Mus musculus      10090
## EH3769 10X PBMC 4k raw coun..       10X Genomics Homo sapiens       9606
## EH3770 10X PBMC 4k filtered..       10X Genomics Homo sapiens       9606
## EH3771 10X PBMC 4k raw HDF5..       10X Genomics Homo sapiens       9606
## EH3772 10X PBMC 4k molecule..       10X Genomics Homo sapiens       9606
##             genome            description coordinate_1_based
##        <character>            <character>          <integer>
## EH3685        mm10 Molecule information..                  1
## EH3686        mm10 Filtered HDF5 matrix..                  1
## EH3687        mm10 Raw HDF5 matrix for ..                  1
## EH3688        mm10 Filtered count matri..                  1
## EH3689        mm10 Raw count matrix for..                  1
## ...            ...                    ...                ...
## EH3732        mm10 Molecule information..                  1
## EH3769        hg38 Raw count matrix for..                  1
## EH3770        hg38 Filtered count matri..                  1
## EH3771        hg38 Raw HDF5 matrix for ..                  1
## EH3772        hg38 Molecule information..                  1
##                    maintainer rdatadateadded    preparerclass
##                   <character>    <character>      <character>
## EH3685 Aaron Lun <infinite...     2020-08-26 DropletTestFiles
## EH3686 Aaron Lun <infinite...     2020-08-26 DropletTestFiles
## EH3687 Aaron Lun <infinite...     2020-08-26 DropletTestFiles
## EH3688 Aaron Lun <infinite...     2020-08-26 DropletTestFiles
## EH3689 Aaron Lun <infinite...     2020-08-26 DropletTestFiles
## ...                       ...            ...              ...
## EH3732 Aaron Lun <infinite...     2020-08-26 DropletTestFiles
## EH3769 Aaron Lun <infinite...     2020-09-08 DropletTestFiles
## EH3770 Aaron Lun <infinite...     2020-09-08 DropletTestFiles
## EH3771 Aaron Lun <infinite...     2020-09-08 DropletTestFiles
## EH3772 Aaron Lun <infinite...     2020-09-08 DropletTestFiles
##                                                   tags  rdataclass
##                                                 <AsIs> <character>
## EH3685 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3686 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3687 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3688 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3689 ExperimentHub,ExperimentData,ExpressionData,...   character
## ...                                                ...         ...
## EH3732 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3769 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3770 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3771 ExperimentHub,ExperimentData,ExpressionData,...   character
## EH3772 ExperimentHub,ExperimentData,ExpressionData,...   character
##                     rdatapath              sourceurl  sourcetype
##                   <character>            <character> <character>
## EH3685 DropletTestFiles/ten.. https://support.10xg..        HDF5
## EH3686 DropletTestFiles/ten.. https://support.10xg..        HDF5
## EH3687 DropletTestFiles/ten.. https://support.10xg..        HDF5
## EH3688 DropletTestFiles/ten.. https://support.10xg..      tar.gz
## EH3689 DropletTestFiles/ten.. https://support.10xg..      tar.gz
## ...                       ...                    ...         ...
## EH3732 DropletTestFiles/bac.. https://jmlab-gitlab..        HDF5
## EH3769 DropletTestFiles/ten.. https://support.10xg..      tar.gz
## EH3770 DropletTestFiles/ten.. https://support.10xg..      tar.gz
## EH3771 DropletTestFiles/ten.. https://support.10xg..        HDF5
## EH3772 DropletTestFiles/ten.. https://support.10xg..        HDF5
##                 file.dataset file.version              file.name
##                  <character>  <character>            <character>
## EH3685 tenx-2.0.1-nuclei_900        1.0.0            mol_info.h5
## EH3686 tenx-2.0.1-nuclei_900        1.0.0            filtered.h5
## EH3687 tenx-2.0.1-nuclei_900        1.0.0                 raw.h5
## EH3688 tenx-2.0.1-nuclei_900        1.0.0        filtered.tar.gz
## EH3689 tenx-2.0.1-nuclei_900        1.0.0             raw.tar.gz
## ...                      ...          ...                    ...
## EH3732 bach-mammary-swapping        1.0.0 hiseq_4000/mol_info_..
## EH3769     tenx-2.1.0-pbmc4k        1.0.0             raw.tar.gz
## EH3770     tenx-2.1.0-pbmc4k        1.0.0        filtered.tar.gz
## EH3771     tenx-2.1.0-pbmc4k        1.0.0                 raw.h5
## EH3772     tenx-2.1.0-pbmc4k        1.0.0            mol_info.h5

The second is to actually obtain a resource. This is provided in the form of a (read-only!) path on which further operations can be applied.

getTestFile(out$rdatapath[1], prefix=FALSE)
##                                                      EH3685 
## "/home/biocbuild/.cache/R/ExperimentHub/6f28f49ddba3b_3721"

Currently, all of the files come from 10X Genomics datasets. As such, we will see a lot of filtered/raw count matrices, molecule information files and HDF5 barcode matrices. We refer readers to the (relevant section)[https://support.10xgenomics.com/single-cell-gene-expression/software/pipelines/latest/output/overview] of the 10X Genomics website for more details.

3 Example

Here, we obtain a path to a filtered HDF5 matrix and read it in with a DropletUtils function. This produces a SingleCellExperiment object for use in various Bioconductor pipelines.

library(DropletUtils)
path <- getTestFile("tenx-3.1.0-5k_pbmc_protein_v3/1.0.0/filtered.h5", prefix=TRUE)
sce <- read10xCounts(path, type="HDF5")
sce
## class: SingleCellExperiment 
## dim: 33570 5247 
## metadata(1): Samples
## assays(1): counts
## rownames(33570): ENSG00000243485 ENSG00000237613 ... IgG2a IgG2b
## rowData names(3): ID Symbol Type
## colnames: NULL
## colData names(2): Sample Barcode
## reducedDimNames(0):
## mainExpName: NULL
## altExpNames(0):

Session information

sessionInfo()
## R version 4.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.18-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] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] HDF5Array_1.30.0            DelayedArray_0.28.0        
##  [3] DropletUtils_1.22.0         SingleCellExperiment_1.24.0
##  [5] SummarizedExperiment_1.32.0 Biobase_2.62.0             
##  [7] GenomicRanges_1.54.0        GenomeInfoDb_1.38.0        
##  [9] IRanges_2.36.0              BiocGenerics_0.48.0        
## [11] MatrixGenerics_1.14.0       matrixStats_1.0.0          
## [13] S4Vectors_0.40.0            DropletTestFiles_1.12.0    
## [15] BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##  [1] DBI_1.1.3                     bitops_1.0-7                 
##  [3] rlang_1.1.1                   magrittr_2.0.3               
##  [5] compiler_4.3.1                RSQLite_2.3.1                
##  [7] DelayedMatrixStats_1.24.0     png_0.1-8                    
##  [9] vctrs_0.6.4                   pkgconfig_2.0.3              
## [11] crayon_1.5.2                  fastmap_1.1.1                
## [13] dbplyr_2.3.4                  XVector_0.42.0               
## [15] ellipsis_0.3.2                scuttle_1.12.0               
## [17] utf8_1.2.4                    promises_1.2.1               
## [19] rmarkdown_2.25                purrr_1.0.2                  
## [21] bit_4.0.5                     xfun_0.40                    
## [23] zlibbioc_1.48.0               cachem_1.0.8                 
## [25] beachmat_2.18.0               jsonlite_1.8.7               
## [27] blob_1.2.4                    later_1.3.1                  
## [29] rhdf5filters_1.14.0           Rhdf5lib_1.24.0              
## [31] BiocParallel_1.36.0           interactiveDisplayBase_1.40.0
## [33] parallel_4.3.1                R6_2.5.1                     
## [35] bslib_0.5.1                   limma_3.58.0                 
## [37] jquerylib_0.1.4               Rcpp_1.0.11                  
## [39] bookdown_0.36                 knitr_1.44                   
## [41] R.utils_2.12.2                httpuv_1.6.12                
## [43] Matrix_1.6-1.1                tidyselect_1.2.0             
## [45] abind_1.4-5                   yaml_2.3.7                   
## [47] codetools_0.2-19              curl_5.1.0                   
## [49] lattice_0.22-5                tibble_3.2.1                 
## [51] shiny_1.7.5.1                 withr_2.5.1                  
## [53] KEGGREST_1.42.0               evaluate_0.22                
## [55] BiocFileCache_2.10.0          ExperimentHub_2.10.0         
## [57] Biostrings_2.70.1             pillar_1.9.0                 
## [59] BiocManager_1.30.22           filelock_1.0.2               
## [61] generics_0.1.3                RCurl_1.98-1.12              
## [63] BiocVersion_3.18.0            sparseMatrixStats_1.14.0     
## [65] xtable_1.8-4                  glue_1.6.2                   
## [67] tools_4.3.1                   AnnotationHub_3.10.0         
## [69] locfit_1.5-9.8                rhdf5_2.46.0                 
## [71] grid_4.3.1                    AnnotationDbi_1.64.0         
## [73] edgeR_4.0.0                   GenomeInfoDbData_1.2.11      
## [75] cli_3.6.1                     rappdirs_0.3.3               
## [77] fansi_1.0.5                   S4Arrays_1.2.0               
## [79] dplyr_1.1.3                   R.methodsS3_1.8.2            
## [81] sass_0.4.7                    digest_0.6.33                
## [83] SparseArray_1.2.0             dqrng_0.3.1                  
## [85] memoise_2.0.1                 htmltools_0.5.6.1            
## [87] R.oo_1.25.0                   lifecycle_1.0.3              
## [89] httr_1.4.7                    statmod_1.5.0                
## [91] mime_0.12                     bit64_4.0.5