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(): 2018-10-31
BS.obj.ex.fit <- eh[["EH1072"]]
#> see ?tissueTreg and browseVignettes('tissueTreg') for documentation
#> downloading 0 resources
#> loading from cache 
#>     '/home/biocbuild//.ExperimentHub/1072'For 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
#> downloading 0 resources
#> loading from cache 
#>     '/home/biocbuild//.ExperimentHub/1073'colnames(BS.obj.ex.fit.combined)
#> [1] "Fat-Treg"     "Liver-Treg"   "Lymph-N-Tcon" "Lymph-N-Treg"
#> [5] "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
#> downloading 0 resources
#> loading from cache 
#>     '/home/biocbuild//.ExperimentHub/1074'EnsemblIDs 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
#> ENSMUSG00000030105            11            16              12
#> ENSMUSG00000042428             0             0               0
#> ENSMUSG00000096054             1             2               1
#> ENSMUSG00000046532             0             0               2
#> ENSMUSG00000020495             2             2               2
#> ENSMUSG00000058979            14             7               8
#>                    Lymph-N-Tcon-R2 Lymph-N-Tcon-R3 Lymph-N-Treg-R1
#> ENSMUSG00000030105              19              19              18
#> ENSMUSG00000042428               0               0               0
#> ENSMUSG00000096054               1               1               1
#> ENSMUSG00000046532               1               1               0
#> ENSMUSG00000020495               3               2               3
#> ENSMUSG00000058979               8              14               8
#>                    Lymph-N-Treg-R2 Lymph-N-Treg-R3 Skin-Treg-R1 Skin-Treg-R2
#> ENSMUSG00000030105              22              21           16           19
#> ENSMUSG00000042428               0               0            0            0
#> ENSMUSG00000096054               2               1            1            2
#> ENSMUSG00000046532               0               0            0            1
#> ENSMUSG00000020495               2               2            1            1
#> ENSMUSG00000058979               8              10            6            3
#>                    Skin-Treg-R3
#> ENSMUSG00000030105           24
#> ENSMUSG00000042428            0
#> ENSMUSG00000096054            3
#> ENSMUSG00000046532            1
#> ENSMUSG00000020495            1
#> ENSMUSG00000058979            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 
#>              14              16              20              13 
#>   Liver-Treg-R2   Liver-Treg-R3 Lymph-N-Tcon-R1 Lymph-N-Tcon-R2 
#>              14              18               1               1 
#> Lymph-N-Tcon-R3 Lymph-N-Treg-R1 Lymph-N-Treg-R2 Lymph-N-Treg-R3 
#>               1              15              13              15 
#>    Skin-Treg-R1    Skin-Treg-R2    Skin-Treg-R3 
#>              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 3.5.1 Patched (2018-07-12 r74967)
#> Platform: x86_64-pc-linux-gnu (64-bit)
#> Running under: Ubuntu 16.04.5 LTS
#> 
#> Matrix products: default
#> BLAS: /home/biocbuild/bbs-3.8-bioc/R/lib/libRblas.so
#> LAPACK: /home/biocbuild/bbs-3.8-bioc/R/lib/libRlapack.so
#> 
#> locale:
#>  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
#>  [3] LC_TIME=en_US.UTF-8        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    parallel  stats     graphics  grDevices utils     datasets 
#> [8] methods   base     
#> 
#> other attached packages:
#>  [1] reshape2_1.4.3              ggplot2_3.1.0              
#>  [3] tissueTreg_1.2.0            bsseq_1.18.0               
#>  [5] SummarizedExperiment_1.12.0 DelayedArray_0.8.0         
#>  [7] BiocParallel_1.16.0         matrixStats_0.54.0         
#>  [9] Biobase_2.42.0              GenomicRanges_1.34.0       
#> [11] GenomeInfoDb_1.18.0         IRanges_2.16.0             
#> [13] S4Vectors_0.20.0            ExperimentHub_1.8.0        
#> [15] AnnotationHub_2.14.0        BiocGenerics_0.28.0        
#> [17] BiocStyle_2.10.0           
#> 
#> loaded via a namespace (and not attached):
#>  [1] bitops_1.0-6                  bit64_0.9-7                  
#>  [3] httr_1.3.1                    rprojroot_1.3-2              
#>  [5] tools_3.5.1                   backports_1.1.2              
#>  [7] R6_2.3.0                      HDF5Array_1.10.0             
#>  [9] DBI_1.0.0                     lazyeval_0.2.1               
#> [11] colorspace_1.3-2              permute_0.9-4                
#> [13] withr_2.1.2                   tidyselect_0.2.5             
#> [15] bit_1.1-14                    curl_3.2                     
#> [17] compiler_3.5.1                labeling_0.3                 
#> [19] rtracklayer_1.42.0            bookdown_0.7                 
#> [21] scales_1.0.0                  stringr_1.3.1                
#> [23] digest_0.6.18                 Rsamtools_1.34.0             
#> [25] rmarkdown_1.10                R.utils_2.7.0                
#> [27] XVector_0.22.0                pkgconfig_2.0.2              
#> [29] htmltools_0.3.6               limma_3.38.0                 
#> [31] BSgenome_1.50.0               rlang_0.3.0.1                
#> [33] RSQLite_2.1.1                 shiny_1.1.0                  
#> [35] DelayedMatrixStats_1.4.0      bindr_0.1.1                  
#> [37] gtools_3.8.1                  dplyr_0.7.7                  
#> [39] R.oo_1.22.0                   RCurl_1.95-4.11              
#> [41] magrittr_1.5                  GenomeInfoDbData_1.2.0       
#> [43] Matrix_1.2-14                 Rcpp_0.12.19                 
#> [45] munsell_0.5.0                 Rhdf5lib_1.4.0               
#> [47] R.methodsS3_1.7.1             stringi_1.2.4                
#> [49] yaml_2.2.0                    zlibbioc_1.28.0              
#> [51] rhdf5_2.26.0                  plyr_1.8.4                   
#> [53] grid_3.5.1                    blob_1.1.1                   
#> [55] promises_1.0.1                crayon_1.3.4                 
#> [57] lattice_0.20-35               Biostrings_2.50.0            
#> [59] locfit_1.5-9.1                knitr_1.20                   
#> [61] pillar_1.3.0                  glue_1.3.0                   
#> [63] XML_3.98-1.16                 evaluate_0.12                
#> [65] data.table_1.11.8             BiocManager_1.30.3           
#> [67] httpuv_1.4.5                  purrr_0.2.5                  
#> [69] gtable_0.2.0                  assertthat_0.2.0             
#> [71] xfun_0.4                      mime_0.6                     
#> [73] xtable_1.8-3                  later_0.7.5                  
#> [75] tibble_1.4.2                  GenomicAlignments_1.18.0     
#> [77] AnnotationDbi_1.44.0          memoise_1.1.0                
#> [79] bindrcpp_0.2.2                interactiveDisplayBase_1.20.0