1 Introduction

HDF5Array and DelayedArray are convenient Bioconductor packages to work with arrays “on disk” instead of “in memory”. The cytomapper package builds upon these tools to allow storing image data on disk. While this facilitates the handling of hundreds to thousand of images in parallel, little changes are experienced from the user perspective. Here, we explain which cytomapper function are effected by storing images on disk.

2 Reading in data to disk

The loadImages function takes extra arguments to specify if images should be stored on disk (on_disk) and where to store them (h5FilesPath). When images should be stored for longer than the current R session, the h5FilesPath needs to be set to a permanent directory. The HDF5Array package provides the getHDF5DumpDir function, which initialize a temporary directory, which will be deleted once the session closes. This is what we will use here for demonstration purposes.

library(HDF5Array)

# Define output directory
cur_dir <- getHDF5DumpDir()

path.to.images <- system.file("extdata", package = "cytomapper")
image.list <- loadImages(path.to.images, pattern = "mask.tiff",
                             on_disk = TRUE, h5FilesPath = cur_dir)

# Show list
image.list
## CytoImageList containing 3 image(s)
## names(3): E34_mask G01_mask J02_mask 
## Each image contains 1 channel
# Scale images
image.list <- scaleImages(image.list, value = 2^16 - 1)
image.list$E34_mask
## <100 x 100> DelayedMatrix object of type "double":
##          [,1]   [,2]   [,3] ...  [,99] [,100]
##   [1,]    824    824    824   .   1265   1265
##   [2,]    824    824    824   .   1265      0
##   [3,]    824    824    824   .      0      0
##   [4,]    824    824    824   .      0   1295
##   [5,]    824    824    824   .      0   1295
##    ...      .      .      .   .      .      .
##  [96,]    835      0    876   .      0      0
##  [97,]    835      0    876   .      0      0
##  [98,]    835      0    876   .   1293   1293
##  [99,]      0      0    876   .   1293   1293
## [100,]      0      0      0   .   1293   1293

This function call reads in the .tiff images before writing them as .h5 files to the indicated directory. It generates a CytoImageList object that contains HDF5Array or DelayedArray objects (instead of Image objects) in each slot, which references the data in the .h5 files. The name of the array within the .h5 file is automatically set as the original filename and cannot be changed easily from within R. Writing the images to disk is slow and therefore less efficient compared to keeping images in memory. However, when working with hundreds of images in parallel, all images remain accessible from within the R session if they are stored on disk. In conclusion: when working with small image sets it is recommended reading them into memory (on_disk = FALSE, default), while large image sets should be written to disk (on_disk = TRUE). When reading in the same images multiple times, the .h5 files will always be replaced.

Please follow the main vignette for instructions on how to work with multi-channel images in R.

3 Converting from on disk to memory and back

Existing CytoImageList objects, which contain individual Image objects in memory can be converted into CytoImageList objects storing DelayedArray or HDF5Array objects on disk. For this the following function calls can be used:

data("pancreasImages")

pancreasImages_onDisk <- CytoImageList(pancreasImages,
                                        on_disk = TRUE, 
                                        h5FilesPath = cur_dir)

# Image object
pancreasImages$E34_imc
## Image 
##   colorMode    : Grayscale 
##   storage.mode : double 
##   dim          : 100 100 5 
##   frames.total : 5 
##   frames.render: 5 
## 
## imageData(object)[1:5,1:6,1]
##           [,1]      [,2]         [,3]      [,4]         [,5]         [,6]
## [1,] 2.2357869 0.2537275 1.269632e+00 0.9991982 1.990020e+00 0.000000e+00
## [2,] 2.8855283 1.9900196 2.264642e+00 0.0000000 1.410924e+00 5.654589e-16
## [3,] 3.4009433 0.9950098 9.950098e-01 2.1800663 4.152935e-17 1.990020e+00
## [4,] 3.2238317 3.1750760 1.128341e+00 4.4866042 7.371460e-16 0.000000e+00
## [5,] 0.9987666 1.9900196 2.644036e-15 0.0000000 0.000000e+00 1.523360e+00
# HDF5Array object
pancreasImages_onDisk$E34_imc
## <100 x 100 x 5> HDF5Array object of type "double":
## ,,H3
##             [,1]      [,2]      [,3] ...     [,99]    [,100]
##   [1,] 2.2357869 0.2537275 1.2696325   .  7.265561  1.975094
##   [2,] 2.8855283 1.9900196 2.2646422   .  2.985029  2.885528
##    ...         .         .         .   .         .         .
##  [99,]  2.985029  3.636569 22.976585   . 25.371881 12.045588
## [100,]  3.061645  2.985029  1.990020   . 13.353615  5.636652
## 
## ...
## 
## ,,CDH
##             [,1]      [,2]      [,3] ...    [,99]   [,100]
##   [1,]  0.940284 19.651394 43.284626   . 2.704231 0.000000
##   [2,]  8.393239 29.353861 22.249359   . 7.345311 5.781126
##    ...         .         .         .   .        .        .
##  [99,] 0.9897148 7.3378549 0.0000000   . 0.000000 1.667201
## [100,] 5.8091230 2.2515676 1.9969171   . 4.344125 0.000000
# Seed of HDF5Array object
seed(pancreasImages_onDisk$E34_imc)
## An object of class "HDF5ArraySeed"
## Slot "filepath":
## [1] "/tmp/RtmpHTrbiz/HDF5Array_dump/E34_imc.h5"
## 
## Slot "name":
## [1] "/E34_imc"
## 
## Slot "as_sparse":
## [1] FALSE
## 
## Slot "type":
## [1] NA
## 
## Slot "dim":
## [1] 100 100   5
## 
## Slot "chunkdim":
## [1] 100 100   5
## 
## Slot "first_val":
## [1] 2.235787
# Size in memory
format(object.size(pancreasImages), units = "auto")
## [1] "1.2 Mb"
format(object.size(pancreasImages_onDisk), units = "auto")
## [1] "11.8 Kb"

Images can also be moved back to in memory representation:

pancreasImages_inMemory <- CytoImageList(pancreasImages_onDisk,
                                        on_disk = FALSE)

# Compare the image data to the original representation
identical(as.list(pancreasImages_inMemory), as.list(pancreasImages))
## [1] TRUE

4 Effects on package functionality

While most functions of the cytomapper package natively support images stored on disk, there are three exceptions: the normalize, setChannels and mergeChannels functions.

The normalize function will store the normalized images as a second dataset in the same .h5 file as the original data.

# Size of object in memory
format(object.size(pancreasImages_onDisk), units = "auto")
## [1] "11.8 Kb"
# Size of object on disk in kB
file.info(paste0(cur_dir, "/E34_imc.h5"))[,"size"] / 1000
## [1] 148.147
pancreasImages_norm <- normalize(pancreasImages_onDisk)

seed(pancreasImages_norm$E34_imc)
## An object of class "HDF5ArraySeed"
## Slot "filepath":
## [1] "/tmp/RtmpHTrbiz/HDF5Array_dump/E34_imc.h5"
## 
## Slot "name":
## [1] "/E34_imc_norm"
## 
## Slot "as_sparse":
## [1] FALSE
## 
## Slot "type":
## [1] NA
## 
## Slot "dim":
## [1] 100 100   5
## 
## Slot "chunkdim":
## [1] 100 100   5
## 
## Slot "first_val":
## [1] 0.01235403
# Size of object in memory
format(object.size(pancreasImages_norm), units = "auto")
## [1] "11.8 Kb"
# Size of object on disk in kB
file.info(paste0(cur_dir, "/E34_imc.h5"))[,"size"] / 1000
## [1] 414.936

As we can see, the size in memory does not increase when normalizing images. However, the size on disk increases since a second, normalized dataset is stored in the .h5 file. The original dataset can be overwritten by setting overwrite = TRUE to save space on disk. This will however break the links to the original data in all R objects. It is therefore recommended leaving the default overwrite = FALSE. Furthermore, the normalization of images stored on disk is slower compared to normalizing images in memory since normalized images need to be written to disk.

The setChannels function replaces the same channels in all images by a user defined channel. There is no problem with this when keeping images in memory. However, the DelayedArray framework stores the replacement value in subassignemt operations in memory. This means that when using the setChannels function, the size of the object increases in memory usage:

cur_Images1 <- pancreasImages_onDisk
cur_Images2 <- getChannels(pancreasImages_onDisk, 2)
channelNames(cur_Images2) <- "CD99_2"

setChannels(cur_Images1, 1) <- cur_Images2
format(object.size(cur_Images1), units = "auto")
## [1] "27.2 Kb"

The mergeChannels function merges multiple user-defined channels. As this operation creates a completely new image object, one needs to store the merged channels in a different location:

channels1 <- getChannels(pancreasImages_onDisk, 1:2)
channels2 <- getChannels(pancreasImages_onDisk, 3:4)

dir.create(file.path(cur_dir, "test"))
cur_path_2 <- file.path(cur_dir, "test")

channels3 <- mergeChannels(channels1, channels2,
                            h5FilesPath = cur_path_2)

seed(channels3$E34_imc)
## An object of class "HDF5ArraySeed"
## Slot "filepath":
## [1] "/tmp/RtmpHTrbiz/HDF5Array_dump/test/E34_imc.h5"
## 
## Slot "name":
## [1] "/E34_imc"
## 
## Slot "as_sparse":
## [1] FALSE
## 
## Slot "type":
## [1] NA
## 
## Slot "dim":
## [1] 100 100   4
## 
## Slot "chunkdim":
## [1] 100 100   4
## 
## Slot "first_val":
## [1] 2.235787

Session info

## 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            rhdf5_2.46.0               
##  [3] DelayedArray_0.28.0         SparseArray_1.2.0          
##  [5] S4Arrays_1.2.0              abind_1.4-5                
##  [7] Matrix_1.6-1.1              ggplot2_3.4.4              
##  [9] cowplot_1.1.1               cytomapper_1.14.0          
## [11] SingleCellExperiment_1.24.0 SummarizedExperiment_1.32.0
## [13] Biobase_2.62.0              GenomicRanges_1.54.0       
## [15] GenomeInfoDb_1.38.0         IRanges_2.36.0             
## [17] S4Vectors_0.40.0            BiocGenerics_0.48.0        
## [19] MatrixGenerics_1.14.0       matrixStats_1.0.0          
## [21] EBImage_4.44.0              BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##  [1] bitops_1.0-7             gridExtra_2.3            rlang_1.1.1             
##  [4] magrittr_2.0.3           svgPanZoom_0.3.4         shinydashboard_0.7.2    
##  [7] compiler_4.3.1           png_0.1-8                systemfonts_1.0.5       
## [10] fftwtools_0.9-11         vctrs_0.6.4              pkgconfig_2.0.3         
## [13] SpatialExperiment_1.12.0 crayon_1.5.2             fastmap_1.1.1           
## [16] magick_2.8.1             XVector_0.42.0           ellipsis_0.3.2          
## [19] labeling_0.4.3           utf8_1.2.4               promises_1.2.1          
## [22] rmarkdown_2.25           ggbeeswarm_0.7.2         xfun_0.40               
## [25] zlibbioc_1.48.0          cachem_1.0.8             jsonlite_1.8.7          
## [28] later_1.3.1              rhdf5filters_1.14.0      Rhdf5lib_1.24.0         
## [31] BiocParallel_1.36.0      jpeg_0.1-10              tiff_0.1-11             
## [34] terra_1.7-55             parallel_4.3.1           R6_2.5.1                
## [37] bslib_0.5.1              RColorBrewer_1.1-3       jquerylib_0.1.4         
## [40] Rcpp_1.0.11              bookdown_0.36            knitr_1.44              
## [43] httpuv_1.6.12            nnls_1.5                 tidyselect_1.2.0        
## [46] yaml_2.3.7               viridis_0.6.4            codetools_0.2-19        
## [49] lattice_0.22-5           tibble_3.2.1             shiny_1.7.5.1           
## [52] withr_2.5.1              evaluate_0.22            gridGraphics_0.5-1      
## [55] pillar_1.9.0             BiocManager_1.30.22      generics_0.1.3          
## [58] sp_2.1-1                 RCurl_1.98-1.12          munsell_0.5.0           
## [61] scales_1.2.1             xtable_1.8-4             glue_1.6.2              
## [64] tools_4.3.1              locfit_1.5-9.8           grid_4.3.1              
## [67] colorspace_2.1-0         GenomeInfoDbData_1.2.11  raster_3.6-26           
## [70] beeswarm_0.4.0           vipor_0.4.5              cli_3.6.1               
## [73] fansi_1.0.5              viridisLite_0.4.2        svglite_2.1.2           
## [76] dplyr_1.1.3              gtable_0.3.4             sass_0.4.7              
## [79] digest_0.6.33            farver_2.1.1             rjson_0.2.21            
## [82] htmlwidgets_1.6.2        htmltools_0.5.6.1        lifecycle_1.0.3         
## [85] mime_0.12

5 References