Package version: specL 1.6.2

Contents

1 Preliminaries

ssrc (Sequence Specific Retention Calculator) is an implementation of the algorithm proposed in [1] to predict the Retention Time (RT) of a given peptide sequence.

load libraries

an basic example from the paper …

lapply(c("SCHTAVGR", "SCHTGLGR", "EDLIAYLK"), ssrc)
## [[1]]
## SCHTAVGR 
##  3.20805 
## 
## [[2]]
## SCHTGLGR 
##  5.95145 
## 
## [[3]]
## EDLIAYLK 
## 29.60045

in the following paragraphs we will play with some R packages containing peptide sequence and RT information.

define a R-helper function which derives a linear model and visualize the result

.plot.rt_ssrc <- function(x, y, ...){
  fit <- lm(y~x)
  plot(x, y, ylab='ssrc predicted RT', xlab='RT',
       cex=2,
       asp=1,
       ...)
  
  abline(fit)
  abline(a=0, b=1, col='grey', lwd=2)
  
  legend("topleft", 
         c(paste("spearman", round(cor(x, y, method='spearman'),2)),
           paste('R-squared', round(summary(fit)$r.squared,2)))
         )
} 

2 Example 1 - using specL

3 Example 2 - using msqc1 peptides

library(msqc1)
## Loading required package: lattice

fetch the msqc1

msqc1.8rep.aggregate <- msqc1:::.reshape_rt(msqc1_8rep, peptides=peptides, plot=FALSE)
msqc1.dilution.aggregate <- msqc1:::.reshape_rt(msqc1_dil, peptides=peptides, plot=FALSE)

predict RT

msqc1.peptide.ssrc <- unlist(lapply(as.character(msqc1.dilution.aggregate$Peptide.Sequence), ssrc))

3.1 8replicate data

3.2 Dilution Series data

4 Session information

sessionInfo()
## R version 3.3.0 (2016-05-03)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 14.04.4 LTS
## 
## 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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] msqc1_1.0.0     lattice_0.20-33 specL_1.6.2     protViz_0.2.15 
## [5] seqinr_3.1-3    ade4_1.7-4      RSQLite_1.0.0   DBI_0.4-1      
## [9] BiocStyle_2.0.2
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_0.12.5     digest_0.6.9    grid_3.3.0      formatR_1.4    
##  [5] magrittr_1.5    evaluate_0.9    stringi_1.0-1   rmarkdown_0.9.6
##  [9] tools_3.3.0     stringr_1.0.0   yaml_2.1.13     htmltools_0.3.5
## [13] knitr_1.13

References

[1] O. V. Krokhin, R. Craig, V. Spicer, W. Ens, K. G. Standing, R. C. Beavis, and J. A. Wilkins, β€œ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, vol. 3, no. 9, pp. 908–919, Sep 2004.