#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:
We have provided 2 mzXML files for use in this vignette in adductData.
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())
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')))##                                                   EH1957 
## "/home/biocbuild/.cache/ExperimentHub/737d7ebd9210_1957"## [1] TRUE## see ?adductData and browseVignettes('adductData') for documentation## downloading 1 resources## retrieving 1 resource## loading from cache##                                                   EH1958 
## "/home/biocbuild/.cache/ExperimentHub/737d34eff968_1958"## [1] TRUEThe 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.
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.
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
  )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.
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.
## R version 4.0.3 (2020-10-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.5 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.12-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.12-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.6.0   ExperimentHub_1.16.0 AnnotationHub_2.22.0
## [4] BiocFileCache_1.14.0 dbplyr_1.4.4         BiocGenerics_0.36.0 
## [7] adductData_1.5.0    
## 
## loaded via a namespace (and not attached):
##  [1] Biobase_2.50.0                httr_1.4.2                   
##  [3] bit64_4.0.5                   foreach_1.5.1                
##  [5] shiny_1.5.0                   assertthat_0.2.1             
##  [7] interactiveDisplayBase_1.28.0 BiocManager_1.30.10          
##  [9] stats4_4.0.3                  blob_1.2.1                   
## [11] yaml_2.2.1                    robustbase_0.93-6            
## [13] BiocVersion_3.12.0            pillar_1.4.6                 
## [15] RSQLite_2.2.1                 lattice_0.20-41              
## [17] glue_1.4.2                    digest_0.6.27                
## [19] promises_1.1.1                rvest_0.3.6                  
## [21] plyr_1.8.6                    htmltools_0.5.0              
## [23] httpuv_1.5.4                  pkgconfig_2.0.3              
## [25] purrr_0.3.4                   xtable_1.8-4                 
## [27] later_1.1.0.1                 tibble_3.0.4                 
## [29] generics_0.0.2                IRanges_2.24.0               
## [31] ellipsis_0.3.1                DT_0.16                      
## [33] nnet_7.3-14                   magrittr_1.5                 
## [35] crayon_1.3.4                  mime_0.9                     
## [37] mclust_5.4.6                  memoise_1.1.0                
## [39] evaluate_0.14                 MASS_7.3-53                  
## [41] xml2_1.3.2                    class_7.3-17                 
## [43] tools_4.0.3                   lifecycle_0.2.0              
## [45] stringr_1.4.0                 S4Vectors_0.28.0             
## [47] kernlab_0.9-29                cluster_2.1.0                
## [49] pastecs_1.3.21                AnnotationDbi_1.52.0         
## [51] fpc_2.2-8                     ade4_1.7-15                  
## [53] compiler_4.0.3                rlang_0.4.8                  
## [55] grid_4.0.3                    iterators_1.0.13             
## [57] rappdirs_0.3.1                htmlwidgets_1.5.2            
## [59] rmarkdown_2.5                 boot_1.3-25                  
## [61] codetools_0.2-16              flexmix_2.3-17               
## [63] DBI_1.1.0                     curl_4.3                     
## [65] reshape2_1.4.4                R6_2.4.1                     
## [67] knitr_1.30                    prabclus_2.3-2               
## [69] dplyr_1.0.2                   fastmap_1.0.1                
## [71] bit_4.0.4                     modeltools_0.2-23            
## [73] stringi_1.5.3                 Rcpp_1.0.5                   
## [75] vctrs_0.3.4                   DEoptimR_1.0-8               
## [77] tidyselect_1.1.0              xfun_0.18                    
## [79] diptest_0.75-7