Contents

1 Overview

The UCSC Table Browser is a good source of genomic annotations of many different kinds. It has a clear, easily navigated user interface. It is a good complement to igvR.

The H3K4Me3 post-translational modification is frequently found in active promoters near transcription start sites. Here we obtain H3K4Me3 methylation marks in K562 cells in and around GATA2.

These are the steps involved:

  1. in igvR, display a genomic region of interest
  2. use your mouse to copy the resulting chrom:start-end genomic region string
  3. in the Table Browser, select your genome and dataset of interest
  4. paste the genomic region string into the UCSC Table Browser
  5. click get output to examine the specified data
  6. once you are satisfied that the data are of interest, fill in the output filename and save to a local tsv file
  7. back in R, use read.table to create a data.frame from that file
  8. construct and display an igvR DataFrameAnnotationTrack or DataFrameQuantitativeTrack

All these steps are shown below.

2 Display a genomic region of interest in igvR

library(igvR)
igv <- igvR()
setBrowserWindowTitle(igv, "H3K4Me3 GATA2")
setGenome(igv, "hg38")
showGenomicRegion(igv, "GATA2")
zoomOut(igv)
zoomOut(igv)

3 Obtain the coordinates

getGenomicRegion(igv)
$chrom
[1] "chr3"

$start
[1] 128454762

$end
[1] 128517865

$width
[1] 63104

$string
[1] "chr3:128,454,762-128,517,865"

5 Examine the Data

With the output filename blank, the get output button shows you the selected data as text in your web browser:

6 Download the Data

Return to the previous UCSC Table Browser Screen, fill in a download filename, click get output

7 Read the data into R

tbl <- read.table("~/drop/k562-h3k4me3-gata2.tsv", sep="\t", skip=1, as.is=TRUE, fill=TRUE)
colnames(tbl) <- c("chrom", "start", "end", "score")

Make sure the column classes are as expected:

lapply(tbl, class)
$chrom
[1] "character"

$start
[1] "integer"

$end
[1] "integer"

$score
[1] "numeric"

8 Create and Display a Quantitative Track

track <- DataFrameQuantitativeTrack("H3K4Me3 K562", tbl, autoscale=TRUE, color="darkGreen")
displayTrack(igv, track)

9 Session Info

sessionInfo()
#> R Under development (unstable) (2023-10-22 r85388)
#> 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               LC_TIME=en_GB              LC_COLLATE=C              
#>  [5] LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8    LC_PAPER=en_US.UTF-8       LC_NAME=C                 
#>  [9] LC_ADDRESS=C               LC_TELEPHONE=C             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] BiocStyle_2.31.0
#> 
#> loaded via a namespace (and not attached):
#>  [1] digest_0.6.33       R6_2.5.1            bookdown_0.36       fastmap_1.1.1       xfun_0.40          
#>  [6] cachem_1.0.8        knitr_1.44          htmltools_0.5.6.1   rmarkdown_2.25      cli_3.6.1          
#> [11] sass_0.4.7          jquerylib_0.1.4     compiler_4.4.0      tools_4.4.0         evaluate_0.22      
#> [16] bslib_0.5.1         yaml_2.3.7          BiocManager_1.30.22 jsonlite_1.8.7      rlang_1.1.1