AdductomicsR workflow

Josie Hayes

October 29, 2019

Getting Started

#ensure you have mzR installed
if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("mzR", version = "3.8")

# install the package directly from Github
library(devtools)
devtools::install_github("JosieLHayes/adductomicsR")

#install the data package containing the data 
if (!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("ExperimentHub", version = "3.9")

#or download the packages and install from source
library(devtools)
devtools::install("path_to_dir/adductomicsR")
devtools::install("path_to_dir/adductData")

After installation of the adductomics package and all dependencies attach the adductomics package by typing (copying and pasting) this line of code into the R console and hitting enter:

# load the package
library(adductomicsR)
library(adductData)
library(ExperimentHub)

We have provided 2 mzXML files for use in this vignette in adductData.

Preparation of the data

Mass drift correction: Usually mass drift is corrected using lock masses on the mass spectrometer. If this has not been done a python script is provided in the directory in which the package is saved on your computer at /inst/extdata/thermo_MassDriftCalc.py and can be launched from within python using (replace the path to the python script in your system): exec(open(“thermo_MassDriftCalc.py“).read())

Retention time correction

Each sample is corrected for retention time drift using the rtDevModeling function. To run this with the default parameters enter the path of the directory containing your mzXML files and the run order file (order in which samples were run). For further information on parameters see ??rtDevModelling. An example run order file is available in inst/extdata (within the directory where the package is saved on your computer) and 2 mzXML files are available in adductData/ExperimentHub.These files will be used in this vignette automatically.

Download the mzXML files from ExperimentHub for use in this vignette. They must have .mzXML to be recognized by the package so they are renamed as well.

eh  = suppressMessages(suppressWarnings(ExperimentHub::ExperimentHub()))
temp = suppressMessages(suppressWarnings(
AnnotationHub::query(eh, 'adductData')))
suppressMessages(suppressWarnings(temp[['EH1957']])) #first mzXML file
##                                                   EH1957 
## "/home/biocbuild/.cache/ExperimentHub/6d05248b43a3_1957"
file.rename(cache(temp["EH1957"]), file.path(hubCache(temp),
                                             'ORB35017.mzXML'))
## [1] TRUE
temp[['EH1958']] #second mzXML file
## see ?adductData and browseVignettes('adductData') for documentation
## downloading 1 resources
## retrieving 1 resource
## loading from cache
##                                                   EH1958 
## "/home/biocbuild/.cache/ExperimentHub/6d0526b60db8_1958"
file.rename(cache(temp["EH1958"]), file.path(hubCache(temp), 'ORB35022.mzXML'))
## [1] TRUE
rtDevModelling(
  MS2Dir = hubCache(temp),
  nCores=4,
  runOrder =paste0(system.file("extdata", 
                               package ="adductomicsR"),'/runOrder.csv')
  )

Identify adducts

The specSimPepId function detects adducts present on the peptide. To run this with the default parameters (the largest triply charged peptide of human serum albumin) enter the path of your mzxml files and rtDevModels object. For further information on running this with different peptides see ??specSimPepId. This produces MS2 spectra plots, each in a separate directory for each sample. A plot of the model spectrum is also saved in the mzXML files directory for comparison. The spectra are grouped based on the mz and RT windows, and plots of these groups are also provided based on the raw RT and adjusted RT. These plots can be used to determine whether multiple groups pertain to the same peak.

specSimPepId(
  MS2Dir = hubCache(temp),
  nCores=4, 
  rtDevModels =paste0(hubCache(temp),'/rtDevModels.RData')
  )

Generate a target table for quantification

A list of the adducts for quantification and their monoisotopic mass (MIM), retention time (RT), peptide and charge is generated using the following command. Substitute the file path of the allResults file to the location of your allResults file from the previous step.

generateTargTable(
  allresultsFile=paste0(system.file("extdata",package =
  "adductomicsR"),'/allResults_ALVLIAFAQYLQQCPFEDHVK_example.csv'),
  csvDir=tempdir(check = FALSE)
  )

It is recommended that the allGroups plot ( m/z vs RT) is used to ensure that the adducts in the target table do not pertain to the same peak, as the quantification step can be computationally intensive.

Quantify adducts

See ??adductQuant for an explanation on the parameters for this function. To use your target table produced in the previous step, alter the value in the ‘targTable’ option to the path of your target table. Similarly replaced the path to the directory of your own mzXML files in filePaths (set as “Users/Documents/mzXMLfiles” here.

adductQuant(
  nCores=2, 
  targTable=paste0(system.file("extdata", 
                               package="adductomicsR"),
                               '/exampletargTable2.csv'), 
  intStdRtDrift=30, 
  rtDevModels= paste0(hubCache(temp),'/rtDevModels.RData'),
  filePaths=list.files(hubCache(temp),pattern=".mzXML",
                       all.files=FALSE,full.names=TRUE),
  quantObject=NULL,
  indivAdduct=NULL,
  maxPpm=5,
  minSimScore=0.8,
  spikeScans=1,
  minPeakHeight=100,
  maxRtDrift=20,
  maxRtWindow=240,
  isoWindow=80,
  hkPeptide='LVNEVTEFAK', 
  gaussAlpha=16
  )

Extract the results from the AdductQuantif Object

It is recommended that spectra for each of the adducts found are checked manually using LC-MS software, either at this step or before quantification.

To load your adductquantif object set the path to the file on your system. In the example it assumes the file is present in your working directory.

#load the adductquantif object 
load(paste0(hubCache(temp),"/adductQuantResults.Rda"))

#produce a peakTable from the Adductquantif object and save to a temporary
#directory
suppressMessages(suppressWarnings(outputPeakTable(object=
    object, outputDir=tempdir(check = FALSE))))

Filter the results from the peak area table

Mass spectrometry data is inherently noisy, and the filterAdductTable() function will filter out samples and adducts based on set thresholds. It is recommended to use this filter function to remove adducts that have many missing values and samples where the housekeeping peptide is weak, suggestive of misintegration. Substitute the name of the peaklist file with the path and the name of your peaklist file produced in the previous step.

filterAdductTable(
  paste0(tempdir(check = FALSE),"/adductQuantif_peakList_", Sys.Date(), ".csv")
  )
#session info
sessionInfo()
## R version 3.6.1 (2019-07-05)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.10-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.10-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] parallel  stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
## [1] adductomicsR_1.2.0   ExperimentHub_1.12.0 AnnotationHub_2.18.0
## [4] BiocFileCache_1.10.0 dbplyr_1.4.2         BiocGenerics_0.32.0 
## [7] adductData_1.1.0    
## 
## loaded via a namespace (and not attached):
##  [1] Biobase_2.46.0                httr_1.4.1                   
##  [3] bit64_0.9-7                   foreach_1.4.7                
##  [5] shiny_1.4.0                   assertthat_0.2.1             
##  [7] interactiveDisplayBase_1.24.0 BiocManager_1.30.9           
##  [9] stats4_3.6.1                  blob_1.2.0                   
## [11] yaml_2.2.0                    robustbase_0.93-5            
## [13] BiocVersion_3.10.1            pillar_1.4.2                 
## [15] RSQLite_2.1.2                 backports_1.1.5              
## [17] lattice_0.20-38               glue_1.3.1                   
## [19] digest_0.6.22                 promises_1.1.0               
## [21] rvest_0.3.4                   htmltools_0.4.0              
## [23] httpuv_1.5.2                  plyr_1.8.4                   
## [25] pkgconfig_2.0.3               purrr_0.3.3                  
## [27] xtable_1.8-4                  later_1.0.0                  
## [29] tibble_2.1.3                  IRanges_2.20.0               
## [31] DT_0.9                        nnet_7.3-12                  
## [33] magrittr_1.5                  crayon_1.3.4                 
## [35] mime_0.7                      mclust_5.4.5                 
## [37] memoise_1.1.0                 evaluate_0.14                
## [39] MASS_7.3-51.4                 xml2_1.2.2                   
## [41] class_7.3-15                  tools_3.6.1                  
## [43] stringr_1.4.0                 S4Vectors_0.24.0             
## [45] kernlab_0.9-27                cluster_2.1.0                
## [47] pastecs_1.3.21                AnnotationDbi_1.48.0         
## [49] fpc_2.2-3                     ade4_1.7-13                  
## [51] compiler_3.6.1                rlang_0.4.1                  
## [53] grid_3.6.1                    iterators_1.0.12             
## [55] rappdirs_0.3.1                htmlwidgets_1.5.1            
## [57] rmarkdown_1.16                boot_1.3-23                  
## [59] codetools_0.2-16              flexmix_2.3-15               
## [61] DBI_1.0.0                     curl_4.2                     
## [63] reshape2_1.4.3                R6_2.4.0                     
## [65] knitr_1.25                    prabclus_2.3-1               
## [67] dplyr_0.8.3                   fastmap_1.0.1                
## [69] bit_1.1-14                    zeallot_0.1.0                
## [71] modeltools_0.2-22             stringi_1.4.3                
## [73] Rcpp_1.0.2                    vctrs_0.2.0                  
## [75] DEoptimR_1.0-8                tidyselect_0.2.5             
## [77] xfun_0.10                     diptest_0.75-7