Contents

1 Comparizon

To validate our Retention Time (RT) prediction in this vignette file, we compare the predicted hydrophobicity value using the ssrc method Krokhin et al. (2004) implemented in the protViz package Panse and Grossmann (2019).

The following code snippet performs the comparison on the F255744 data. The file contains amino acid sequences representing the designed flycodes.

library(NestLink)
# load(url("http://fgcz-ms.uzh.ch/~cpanse/p1875/F255744.RData"))
# F255744 <- as.data.frame.mascot(F255744) 
# now available through ExperimentHub

library(ExperimentHub)
eh <- ExperimentHub(); 

load(query(eh, c("NestLink", "F255744.RData"))[[1]])
## see ?NestLink and browseVignettes('NestLink') for documentation
## loading from cache
.ssrc.mascot(F255744, scores = c(10, 20, 40, 50), 
             pch = 16, 
             col = rgb(0.1,0.1,0.1,
                       alpha = 0.1)
)

## [[1]]
## 
## Call:
## lm(formula = xx.ssrc ~ xx$RTINSECONDS)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -38.954  -2.248   0.015   2.228  71.167 
## 
## Coefficients:
##                  Estimate Std. Error t value Pr(>|t|)    
## (Intercept)    -5.580e+00  2.030e-01  -27.48   <2e-16 ***
## xx$RTINSECONDS  8.849e-03  7.434e-05  119.04   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 5.884 on 12295 degrees of freedom
## Multiple R-squared:  0.5354, Adjusted R-squared:  0.5354 
## F-statistic: 1.417e+04 on 1 and 12295 DF,  p-value: < 2.2e-16
## 
## 
## [[2]]
## 
## Call:
## lm(formula = xx.ssrc ~ xx$RTINSECONDS)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -37.387  -2.040  -0.042   1.930  46.035 
## 
## Coefficients:
##                  Estimate Std. Error t value Pr(>|t|)    
## (Intercept)    -6.976e+00  1.621e-01  -43.03   <2e-16 ***
## xx$RTINSECONDS  9.447e-03  6.018e-05  156.99   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 4.12 on 9835 degrees of freedom
## Multiple R-squared:  0.7148, Adjusted R-squared:  0.7147 
## F-statistic: 2.464e+04 on 1 and 9835 DF,  p-value: < 2.2e-16
## 
## 
## [[3]]
## 
## Call:
## lm(formula = xx.ssrc ~ xx$RTINSECONDS)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -15.260  -1.963  -0.114   1.735  45.342 
## 
## Coefficients:
##                  Estimate Std. Error t value Pr(>|t|)    
## (Intercept)    -7.690e+00  1.784e-01  -43.11   <2e-16 ***
## xx$RTINSECONDS  9.781e-03  6.724e-05  145.46   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.506 on 5574 degrees of freedom
## Multiple R-squared:  0.7915, Adjusted R-squared:  0.7915 
## F-statistic: 2.116e+04 on 1 and 5574 DF,  p-value: < 2.2e-16
## 
## 
## [[4]]
## 
## Call:
## lm(formula = xx.ssrc ~ xx$RTINSECONDS)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -9.570 -2.019 -0.142  1.754 45.200 
## 
## Coefficients:
##                  Estimate Std. Error t value Pr(>|t|)    
## (Intercept)    -7.827e+00  2.173e-01  -36.02   <2e-16 ***
## xx$RTINSECONDS  9.848e-03  8.271e-05  119.06   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 3.579 on 3650 degrees of freedom
## Multiple R-squared:  0.7952, Adjusted R-squared:  0.7952 
## F-statistic: 1.418e+04 on 1 and 3650 DF,  p-value: < 2.2e-16

2 Session info

Here is the output of the sessionInfo() command.

## R version 4.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.18-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              
##  [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       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] scales_1.2.1                ggplot2_3.4.4              
##  [3] NestLink_1.18.0             ShortRead_1.60.0           
##  [5] GenomicAlignments_1.38.0    SummarizedExperiment_1.32.0
##  [7] Biobase_2.62.0              MatrixGenerics_1.14.0      
##  [9] matrixStats_1.0.0           Rsamtools_2.18.0           
## [11] GenomicRanges_1.54.0        BiocParallel_1.36.0        
## [13] protViz_0.7.7               gplots_3.1.3               
## [15] Biostrings_2.70.1           GenomeInfoDb_1.38.0        
## [17] XVector_0.42.0              IRanges_2.36.0             
## [19] S4Vectors_0.40.0            ExperimentHub_2.10.0       
## [21] AnnotationHub_3.10.0        BiocFileCache_2.10.0       
## [23] dbplyr_2.3.4                BiocGenerics_0.48.0        
## [25] BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##  [1] DBI_1.1.3                     bitops_1.0-7                 
##  [3] deldir_1.0-9                  rlang_1.1.1                  
##  [5] magrittr_2.0.3                compiler_4.3.1               
##  [7] RSQLite_2.3.1                 mgcv_1.9-0                   
##  [9] png_0.1-8                     vctrs_0.6.4                  
## [11] pkgconfig_2.0.3               crayon_1.5.2                 
## [13] fastmap_1.1.1                 magick_2.8.1                 
## [15] ellipsis_0.3.2                labeling_0.4.3               
## [17] caTools_1.18.2                utf8_1.2.4                   
## [19] promises_1.2.1                rmarkdown_2.25               
## [21] purrr_1.0.2                   bit_4.0.5                    
## [23] xfun_0.40                     zlibbioc_1.48.0              
## [25] cachem_1.0.8                  jsonlite_1.8.7               
## [27] blob_1.2.4                    later_1.3.1                  
## [29] DelayedArray_0.28.0           interactiveDisplayBase_1.40.0
## [31] jpeg_0.1-10                   parallel_4.3.1               
## [33] R6_2.5.1                      bslib_0.5.1                  
## [35] RColorBrewer_1.1-3            jquerylib_0.1.4              
## [37] Rcpp_1.0.11                   bookdown_0.36                
## [39] knitr_1.44                    splines_4.3.1                
## [41] httpuv_1.6.12                 Matrix_1.6-1.1               
## [43] tidyselect_1.2.0              abind_1.4-5                  
## [45] yaml_2.3.7                    codetools_0.2-19             
## [47] hwriter_1.3.2.1               curl_5.1.0                   
## [49] lattice_0.22-5                tibble_3.2.1                 
## [51] withr_2.5.1                   shiny_1.7.5.1                
## [53] KEGGREST_1.42.0               evaluate_0.22                
## [55] pillar_1.9.0                  BiocManager_1.30.22          
## [57] filelock_1.0.2                KernSmooth_2.23-22           
## [59] generics_0.1.3                RCurl_1.98-1.12              
## [61] BiocVersion_3.18.0            munsell_0.5.0                
## [63] gtools_3.9.4                  xtable_1.8-4                 
## [65] glue_1.6.2                    tools_4.3.1                  
## [67] interp_1.1-4                  grid_4.3.1                   
## [69] latticeExtra_0.6-30           colorspace_2.1-0             
## [71] AnnotationDbi_1.64.0          nlme_3.1-163                 
## [73] GenomeInfoDbData_1.2.11       cli_3.6.1                    
## [75] rappdirs_0.3.3                fansi_1.0.5                  
## [77] S4Arrays_1.2.0                dplyr_1.1.3                  
## [79] gtable_0.3.4                  sass_0.4.7                   
## [81] digest_0.6.33                 SparseArray_1.2.0            
## [83] farver_2.1.1                  memoise_2.0.1                
## [85] htmltools_0.5.6.1             lifecycle_1.0.3              
## [87] httr_1.4.7                    mime_0.12                    
## [89] bit64_4.0.5

References

Krokhin, O. V., R. Craig, V. Spicer, W. Ens, K. G. Standing, R. C. Beavis, and J. A. Wilkins. 2004. β€œAn improved model for prediction of retention times of tryptic peptides in ion pair reversed-phase HPLC: its application to protein peptide mapping by off-line HPLC-MALDI MS.” Mol. Cell Proteomics 3 (9): 908–19.

Panse, Christian, and Jonas Grossmann. 2019. protViz: Visualizing and Analyzing Mass Spectrometry Related Data in Proteomics. Vienna, Austria: R Foundation for Statistical Computing. https://www.R-project.org.