The DNA methylation data have been stored as rds files and are bsseq objects. They contain the raw counts for each CpG position in the mm10 reference genome as well the preprocessed smoothed values for each sample. In addition there is a second file containing DNA methylation profiles per tissue, e.g. the replicates from the same tissue have been collapsed. Also here the smoothed values have been precomputed and are directly available.
We first load necessary libraries and data:
library(ExperimentHub)
library(bsseq)eh <- ExperimentHub()
#> snapshotDate(): 2021-10-18
BS.obj.ex.fit <- eh[["EH1072"]]
#> see ?tissueTreg and browseVignettes('tissueTreg') for documentation
#> loading from cacheFor example to visually inspect the DNA methylation state of the FoxP3 gene in the CNS2 region we first specify a single region:
regions <- GRanges(
  seqnames = c("X"),
  ranges = IRanges(start = c(7579676),
                   end = c(7595243)
  )
)We can then directly use the plotRegion function from the bsseq package for visualization based on smoothed values:
plotRegion(BS.obj.ex.fit, region=regions[1,], extend = 2000)We assume that the three sample with higher DNA methylation in CNS2 are the T conventional samples. To check that visually we can color the samples by tissue and cell type.
We check the order in the object first:
colnames(BS.obj.ex.fit)
#>  [1] "Fat-Treg-R1"     "Fat-Treg-R2"     "Fat-Treg-R3"     "Liver-Treg-R1"  
#>  [5] "Liver-Treg-R2"   "Liver-Treg-R3"   "Skin-Treg-R1"    "Skin-Treg-R2"   
#>  [9] "Skin-Treg-R3"    "Lymph-N-Tcon-R1" "Lymph-N-Tcon-R2" "Lymph-N-Tcon-R3"
#> [13] "Lymph-N-Treg-R1" "Lymph-N-Treg-R2" "Lymph-N-Treg-R3"And assign the colors:
pData <- pData(BS.obj.ex.fit)
pData$col <- rep(c("red", "blue", "green", "yellow", "orange"), rep(3,5))
pData(BS.obj.ex.fit) <- pData
plotRegion(BS.obj.ex.fit, region=regions[1,], extend = 2000)This plot is confirming our assumption but we don’t have to plot all samples since they seem to be already consistent. We would now like to do the same region using smoothed values for each group.
The smoothed data has already been precomputed and stored in a another rds file which we first need to load:
BS.obj.ex.fit.combined <- eh[["EH1073"]]
#> see ?tissueTreg and browseVignettes('tissueTreg') for documentation
#> loading from cachecolnames(BS.obj.ex.fit.combined)
#> [1] "Fat-Treg"     "Liver-Treg"   "Lymph-N-Tcon" "Lymph-N-Treg" "Skin-Treg"We now only have the tissue and cell type instead of the replicates. We assign the same colors:
pData <- pData(BS.obj.ex.fit.combined)
pData$col <- c("red", "blue", "yellow", "orange", "green")
pData(BS.obj.ex.fit.combined) <- pData
plotRegion(BS.obj.ex.fit.combined, region=regions[1,], extend = 2000)The RNA-seq experiments are available and as a SummarizedExperiment object. Two objects are available for usage: RPKM values and htseq counts. We will use the RPKM values and would like to look up the expression of FoxP3:
We load the SummarizedExperiment object:
se_rpkms <- eh[["EH1074"]]
#> see ?tissueTreg and browseVignettes('tissueTreg') for documentation
#> loading from cacheEnsemblIDs are given as well as gene symbols:
head(assay(se_rpkms))
#>                    Fat-Treg-R1 Fat-Treg-R2 Fat-Treg-R3 Liver-Treg-R1
#> ENSMUSG00000030105          29          11          19             6
#> ENSMUSG00000042428           0           0           0             0
#> ENSMUSG00000096054           2           1           3             1
#> ENSMUSG00000046532           5           5           3             0
#> ENSMUSG00000020495           2           0           2             1
#> ENSMUSG00000058979           2           4           4             7
#>                    Liver-Treg-R2 Liver-Treg-R3 Lymph-N-Tcon-R1 Lymph-N-Tcon-R2
#> ENSMUSG00000030105            11            16              12              19
#> ENSMUSG00000042428             0             0               0               0
#> ENSMUSG00000096054             1             2               1               1
#> ENSMUSG00000046532             0             0               2               1
#> ENSMUSG00000020495             2             2               2               3
#> ENSMUSG00000058979            14             7               8               8
#>                    Lymph-N-Tcon-R3 Lymph-N-Treg-R1 Lymph-N-Treg-R2
#> ENSMUSG00000030105              19              18              22
#> ENSMUSG00000042428               0               0               0
#> ENSMUSG00000096054               1               1               2
#> ENSMUSG00000046532               1               0               0
#> ENSMUSG00000020495               2               3               2
#> ENSMUSG00000058979              14               8               8
#>                    Lymph-N-Treg-R3 Skin-Treg-R1 Skin-Treg-R2 Skin-Treg-R3
#> ENSMUSG00000030105              21           16           19           24
#> ENSMUSG00000042428               0            0            0            0
#> ENSMUSG00000096054               1            1            2            3
#> ENSMUSG00000046532               0            0            1            1
#> ENSMUSG00000020495               2            1            1            1
#> ENSMUSG00000058979              10            6            3            8
head(rowData(se_rpkms))
#> DataFrame with 6 rows and 1 column
#>                      id_symbol
#>                    <character>
#> ENSMUSG00000030105       Arl8b
#> ENSMUSG00000042428       Mgat3
#> ENSMUSG00000096054       Syne1
#> ENSMUSG00000046532          Ar
#> ENSMUSG00000020495        Smg8
#> ENSMUSG00000058979       Cecr5We can for example obtain the RPKM values for Foxp3 in this way:
assay(se_rpkms)[rowData(se_rpkms)$id_symbol=="Foxp3",]
#>     Fat-Treg-R1     Fat-Treg-R2     Fat-Treg-R3   Liver-Treg-R1   Liver-Treg-R2 
#>              14              16              20              13              14 
#>   Liver-Treg-R3 Lymph-N-Tcon-R1 Lymph-N-Tcon-R2 Lymph-N-Tcon-R3 Lymph-N-Treg-R1 
#>              18               1               1               1              15 
#> Lymph-N-Treg-R2 Lymph-N-Treg-R3    Skin-Treg-R1    Skin-Treg-R2    Skin-Treg-R3 
#>              13              15              25              14              21colData() also contains information about the tissue and cell type the replicate belongs to:
head(colData(se_rpkms))
#> DataFrame with 6 rows and 1 column
#>               tissue_cell
#>               <character>
#> Fat-Treg-R1      Fat-Treg
#> Fat-Treg-R2      Fat-Treg
#> Fat-Treg-R3      Fat-Treg
#> Liver-Treg-R1  Liver-Treg
#> Liver-Treg-R2  Liver-Treg
#> Liver-Treg-R3  Liver-TregWe can put this information together and visualize a simple barplot:
library(ggplot2)
library(reshape2)
foxp3_rpkm <- assay(se_rpkms)[rowData(se_rpkms)$id_symbol=="Foxp3",]
foxp3_rpkm_molten <- melt(foxp3_rpkm)
ggplot(data=foxp3_rpkm_molten, aes(x=rownames(foxp3_rpkm_molten), y=value, fill=colData(se_rpkms)$tissue_cell)) +
    geom_bar(stat="identity") +
    theme(axis.text.x=element_text(angle=45, hjust=1)) +
    xlab("Sample") +
    ylab("RPKM") +
    ggtitle("FoxP3 expression") +
    guides(fill=guide_legend(title="tissue / cell type"))#> R version 4.1.1 (2021-08-10)
#> Platform: x86_64-pc-linux-gnu (64-bit)
#> Running under: Ubuntu 20.04.3 LTS
#> 
#> Matrix products: default
#> BLAS:   /home/biocbuild/bbs-3.14-bioc/R/lib/libRblas.so
#> LAPACK: /home/biocbuild/bbs-3.14-bioc/R/lib/libRlapack.so
#> 
#> 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       
#> 
#> attached base packages:
#> [1] stats4    stats     graphics  grDevices utils     datasets  methods  
#> [8] base     
#> 
#> other attached packages:
#>  [1] reshape2_1.4.4              ggplot2_3.3.5              
#>  [3] tissueTreg_1.14.0           bsseq_1.30.0               
#>  [5] SummarizedExperiment_1.24.0 Biobase_2.54.0             
#>  [7] MatrixGenerics_1.6.0        matrixStats_0.61.0         
#>  [9] GenomicRanges_1.46.0        GenomeInfoDb_1.30.0        
#> [11] IRanges_2.28.0              S4Vectors_0.32.0           
#> [13] ExperimentHub_2.2.0         AnnotationHub_3.2.0        
#> [15] BiocFileCache_2.2.0         dbplyr_2.1.1               
#> [17] BiocGenerics_0.40.0         BiocStyle_2.22.0           
#> 
#> loaded via a namespace (and not attached):
#>   [1] colorspace_2.0-2              rjson_0.2.20                 
#>   [3] ellipsis_0.3.2                XVector_0.34.0               
#>   [5] farver_2.1.0                  bit64_4.0.5                  
#>   [7] interactiveDisplayBase_1.32.0 AnnotationDbi_1.56.1         
#>   [9] fansi_0.5.0                   R.methodsS3_1.8.1            
#>  [11] sparseMatrixStats_1.6.0       cachem_1.0.6                 
#>  [13] knitr_1.36                    jsonlite_1.7.2               
#>  [15] Rsamtools_2.10.0              png_0.1-7                    
#>  [17] R.oo_1.24.0                   shiny_1.7.1                  
#>  [19] HDF5Array_1.22.0              BiocManager_1.30.16          
#>  [21] compiler_4.1.1                httr_1.4.2                   
#>  [23] assertthat_0.2.1              Matrix_1.3-4                 
#>  [25] fastmap_1.1.0                 limma_3.50.0                 
#>  [27] later_1.3.0                   htmltools_0.5.2              
#>  [29] tools_4.1.1                   gtable_0.3.0                 
#>  [31] glue_1.4.2                    GenomeInfoDbData_1.2.7       
#>  [33] dplyr_1.0.7                   rappdirs_0.3.3               
#>  [35] Rcpp_1.0.7                    jquerylib_0.1.4              
#>  [37] vctrs_0.3.8                   Biostrings_2.62.0            
#>  [39] rhdf5filters_1.6.0            rtracklayer_1.54.0           
#>  [41] DelayedMatrixStats_1.16.0     xfun_0.27                    
#>  [43] stringr_1.4.0                 mime_0.12                    
#>  [45] lifecycle_1.0.1               restfulr_0.0.13              
#>  [47] gtools_3.9.2                  XML_3.99-0.8                 
#>  [49] zlibbioc_1.40.0               scales_1.1.1                 
#>  [51] BSgenome_1.62.0               promises_1.2.0.1             
#>  [53] parallel_4.1.1                rhdf5_2.38.0                 
#>  [55] yaml_2.2.1                    curl_4.3.2                   
#>  [57] memoise_2.0.0                 sass_0.4.0                   
#>  [59] stringi_1.7.5                 RSQLite_2.2.8                
#>  [61] BiocVersion_3.14.0            highr_0.9                    
#>  [63] BiocIO_1.4.0                  permute_0.9-5                
#>  [65] filelock_1.0.2                BiocParallel_1.28.0          
#>  [67] rlang_0.4.12                  pkgconfig_2.0.3              
#>  [69] bitops_1.0-7                  evaluate_0.14                
#>  [71] lattice_0.20-45               purrr_0.3.4                  
#>  [73] Rhdf5lib_1.16.0               labeling_0.4.2               
#>  [75] GenomicAlignments_1.30.0      bit_4.0.4                    
#>  [77] tidyselect_1.1.1              plyr_1.8.6                   
#>  [79] magrittr_2.0.1                bookdown_0.24                
#>  [81] R6_2.5.1                      magick_2.7.3                 
#>  [83] generics_0.1.1                DelayedArray_0.20.0          
#>  [85] DBI_1.1.1                     pillar_1.6.4                 
#>  [87] withr_2.4.2                   KEGGREST_1.34.0              
#>  [89] RCurl_1.98-1.5                tibble_3.1.5                 
#>  [91] crayon_1.4.1                  utf8_1.2.2                   
#>  [93] rmarkdown_2.11                locfit_1.5-9.4               
#>  [95] grid_4.1.1                    data.table_1.14.2            
#>  [97] blob_1.2.2                    digest_0.6.28                
#>  [99] xtable_1.8-4                  httpuv_1.6.3                 
#> [101] R.utils_2.11.0                munsell_0.5.0                
#> [103] bslib_0.3.1