specL 1.22.0
This vignette file is thought to demonstrate the retention time stability of the msqc1_8rep and msqc1_dil data contained in the msqc1 R package.
Retention Time (RT) form different LC-MS platforms are often not comparable (duration, offset).
The iRT concept [proposed in pmid22577012 for the RT normalization is used. Instead of using the iRT-peptides MSQC1-peptides are used as reference peptides between the different chromatographic settings and systems.
The normalization is done by applying the following steps:
stats::lm function) which maps the RT space of the corresponding platform into reference platform RT space (by using the stats::predict.lm method)The code below shows the used R functions for the applied RT normalization.
msqc1:::.normalize_rt## function (S, S.training, reference_instrument = "Retention.Time.QTRQP") 
## {
##     S.normalized <- S
##     for (instrument in unique(S.normalized$instrument)) {
##         i <- paste("Retention.Time", instrument, sep = ".")
##         rt.out <- S.training[, reference_instrument]
##         rt.in <- S.training[, i]
##         S.fit <- lm(rt.out ~ rt.in)
##         S.normalized[S.normalized$instrument == instrument, "Retention.Time"] <- predict(S.fit, 
##             data.frame(rt.in = S.normalized[S.normalized$instrument == 
##                 instrument, "Retention.Time"]))
##     }
##     S.normalized.min <- min(S.normalized$Retention.Time, na.rm = TRUE)
##     S.normalized.delta <- max(S.normalized$Retention.Time, na.rm = TRUE) - 
##         S.normalized.min
##     S.normalized$Retention.Time <- (S.normalized$Retention.Time - 
##         S.normalized.min)/S.normalized.delta
##     return(S.normalized)
## }
## <bytecode: 0x563ecacb3278>
## <environment: namespace:msqc1>The reshape_rt method is used for reshaping the data from long to wide format which ease the the model building in the msqc1:::.normalize_rt method above.
msqc1:::.reshape_rt## function (S, peptides = peptides, plot = TRUE, ...) 
## {
##     S <- S[grep("[by]", S$Fragment.Ion), ]
##     S <- S[S$Peptide.Sequence %in% peptides$Peptide.Sequence, 
##         ]
##     S <- aggregate(Retention.Time ~ Peptide.Sequence * instrument, 
##         FUN = mean, data = S)
##     S <- droplevels(S)
##     S.training <- reshape(S, direction = "wide", v.names = "Retention.Time", 
##         timevar = c("instrument"), idvar = "Peptide.Sequence")
##     if (plot == TRUE) {
##         pairs(S.training[, 2:6], pch = as.integer(S.training$Peptide.Sequence), 
##             col = as.integer(S.training$Peptide.Sequence), lower.panel = NULL, 
##             ...)
##     }
##     return(S.training)
## }
## <bytecode: 0x563ecbc0c230>
## <environment: namespace:msqc1>The following R code listings displays some helper functions designed to ease the visualization of the msqc1_8rep and msqc1_dil RT values.
msqc1:::.plot_rt_8rep## function (S, peptides, ...) 
## {
##     .figure_setup()
##     S <- S[grep("[by]", S$Fragment.Ion), ]
##     S <- S[S$Peptide.Sequence %in% peptides$Peptide.Sequence, 
##         ]
##     S <- aggregate(Retention.Time ~ Peptide.Sequence * File.Name.Id * 
##         instrument * relative.amount * Isotope.Label.Type, FUN = mean, 
##         data = S)
##     S <- droplevels(S)
##     xyplot(Retention.Time ~ File.Name.Id | Isotope.Label.Type * 
##         instrument, data = S, layout = c(10, 1), group = S$Peptide.Sequence, 
##         auto.key = list(space = "right", points = TRUE, lines = FALSE, 
##             cex = 1), ...)
## }
## <bytecode: 0x563ecbddab38>
## <environment: namespace:msqc1>msqc1:::.plot_rt_dil## function (S, peptides, ...) 
## {
##     .figure_setup()
##     S <- S[grep("[by]", S$Fragment.Ion), ]
##     S <- S[S$Peptide.Sequence %in% peptides$Peptide.Sequence, 
##         ]
##     S <- aggregate(Retention.Time ~ Peptide.Sequence * File.Name * 
##         instrument * relative.amount * Isotope.Label.Type, FUN = mean, 
##         data = S)
##     S <- droplevels(S)
##     xyplot(Retention.Time ~ relative.amount | Isotope.Label.Type * 
##         instrument, data = S, layout = c(10, 1), group = S$Peptide.Sequence, 
##         scales = list(x = list(rot = 45, log = TRUE, at = sort(unique(S$relative.amount)))), 
##         auto.key = list(space = "right", points = TRUE, lines = FALSE, 
##             cex = 1), ...)
## }
## <bytecode: 0x563ecbe46050>
## <environment: namespace:msqc1>Prepare the training data for the linear model.
S.training.8rep <- msqc1:::.reshape_rt(msqc1_8rep, peptides=peptides, cex=2)8 rep Scatterplot Matrices Plot - Color and icon type indicates the differnet peptides. On an idea plot all values would be on one line.
msqc1:::.plot_rt_8rep(msqc1_8rep, peptides=peptides, xlab='Replicate Id')8 replicate retention time - The graph displays the raw retention time (in minutes) versus the replicate Id of each sample. Each panel displays one LC-MS platform. On some platforms the loading phase was recorded (TRIPLETOF, QTRAP) while on the other platforms not.
The following code will apply the retention time normalization for the msqc_8rep data:
msqc1_8rep.norm <- msqc1:::.normalize_rt(msqc1_8rep, S.training.8rep, 
                                reference_instrument = 'Retention.Time.QTRAP')
msqc1:::.plot_rt_8rep(msqc1_8rep.norm,
             peptides=peptides,
             xlab='Replicate Id',
             ylab='Normalized Retention Time')Normalized 8 replicate retention time - The graphics displays the normalized retention time for each peptide (heavy and light) across all platforms. Apart from the TAENFR peptide all peptides show excellent elution time stability.
S.training.dil <- msqc1:::.reshape_rt(msqc1_dil, peptides=peptides, cex=2)Dilution Scatterplot Matrices Plot - Color and icon type indicates the differnet peptides. On an idea plot all values would be on one line.
The graph in displays the raw RT (in minutes) versus the relative amount (x-axis in log scale) of each sample. Each panel displays one LC-MS platform for each isotope label typ. The graph on the bottom displays the normalized RT for each peptide (heavy and light). Note: Since we have used different LC settings for the dilution data as we have used for the 8 rep data, we had to rebuild the linear models for the normalization.
msqc1:::.plot_rt_dil(msqc1_dil, peptides, xlab='Replicate Id', ylab='Raw Retention Time')msqc1_dil.norm <- msqc1:::.normalize_rt(msqc1_dil, 
                                        S.training.dil, 
                                        reference_instrument = 'Retention.Time.QTRAP')
msqc1:::.plot_rt_dil(msqc1_dil.norm, peptides=peptides, ylab="Normalized Retention Time")The graphs compare the LC gradient of each platform by plotting the normalized RT values again the raw RT values for the msqc1_8rep (left) and msqc1_dil (right) data.
sessionInfo()## R version 4.0.0 (2020-04-24)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.4 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.11-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.11-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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] msqc1_1.16.0     lattice_0.20-41  BiocStyle_2.16.0
## 
## loaded via a namespace (and not attached):
##  [1] Rcpp_1.0.4.6        bookdown_0.18       digest_0.6.25      
##  [4] grid_4.0.0          magrittr_1.5        evaluate_0.14      
##  [7] rlang_0.4.6         stringi_1.4.6       magick_2.3         
## [10] rmarkdown_2.1       tools_4.0.0         stringr_1.4.0      
## [13] xfun_0.13           yaml_2.2.1          compiler_4.0.0     
## [16] BiocManager_1.30.10 htmltools_0.4.0     knitr_1.28