Browse code

[Bioc] return is set as A plot to the current device

shubham1637 authored on 18/12/2019 20:39:38
Showing 6 changed files

... ...
@@ -65,6 +65,8 @@ plotXICgroup <- function(XIC_group, peakAnnot = NULL, Title =NULL){
65 65
 #' @param peakAnnot (numeric) Peak-apex time.
66 66
 #' @param Title (logical) TRUE: name of the list will be displayed as title.
67 67
 #'
68
+#' @return A plot to the current device.
69
+#'
68 70
 #' @examples
69 71
 #' dataPath <- system.file("extdata", package = "DIAlignR")
70 72
 #' run <- "hroest_K120809_Strep10%PlasmaBiolRepl2_R04_SW_filt"
... ...
@@ -101,6 +103,7 @@ plotAnalyteXICs <- function(analyte, run, dataPath = ".", maxFdrQuery = 1.0,
101 103
 #'  and second column indicates intensity.
102 104
 #' @param idx (integer) Indices of aligned chromatograms.
103 105
 #' @param peakAnnot (numeric) Peak-apex time.
106
+#' @return A plot to the current device.
104 107
 plotSingleAlignedChrom <- function(XIC_group, idx, peakAnnot = NULL){
105 108
   intensity <- list()
106 109
   # Update intensities with aligned time indices.
... ...
@@ -143,6 +146,7 @@ plotSingleAlignedChrom <- function(XIC_group, idx, peakAnnot = NULL){
143 146
 #'  and second column indicates intensity.
144 147
 #' @param refPeakLabel (numeric vector) It contains peak apex, left width and right width.
145 148
 #' @param annotatePeak (logical) TRUE: Peak boundaries and apex will be highlighted.
149
+#' @return A plot to the current device.
146 150
 #'
147 151
 #' @examples
148 152
 #' dataPath <- system.file("extdata", package = "DIAlignR")
... ...
@@ -213,6 +217,7 @@ getAlignedFigs <- function(AlignObj, XICs.ref, XICs.eXp, refPeakLabel,
213 217
 #' @param DrawAlignR (logical) TRUE: ggplot objects will be returned.
214 218
 #' @param annotatePeak (logical) TRUE: Peak boundaries and apex will be highlighted.
215 219
 #' @param saveFigs (logical) TRUE: Figures will be saved in AlignedAnalytes.pdf .
220
+#' @return A plot to the current device.
216 221
 #'
217 222
 #' @examples
218 223
 #' dataPath <- system.file("extdata", package = "DIAlignR")
... ...
@@ -271,6 +276,7 @@ plotAlignedAnalytes <- function(AlignObjOutput, plotType = "All", DrawAlignR = F
271 276
 #' License: (c) Author (2019) + MIT
272 277
 #' Date: 2019-12-13
273 278
 #' @param AlignObjOutput (list) The list contains AlignObj, raw XICs for reference and experiment, and reference-peak label.
279
+#' @return A plot to the current device.
274 280
 #'
275 281
 #' @examples
276 282
 #' library(lattice)
... ...
@@ -20,6 +20,9 @@ and second column indicates intensity.}
20 20
 
21 21
 \item{annotatePeak}{(logical) TRUE: Peak boundaries and apex will be highlighted.}
22 22
 }
23
+\value{
24
+A plot to the current device.
25
+}
23 26
 \description{
24 27
 AlignObjOutput is the output from getAlignObjs fucntion.
25 28
 }
... ...
@@ -19,6 +19,9 @@ plotAlignedAnalytes(AlignObjOutput, plotType = "All",
19 19
 
20 20
 \item{saveFigs}{(logical) TRUE: Figures will be saved in AlignedAnalytes.pdf .}
21 21
 }
22
+\value{
23
+A plot to the current device.
24
+}
22 25
 \description{
23 26
 Plot aligned XICs group for a specific peptide.
24 27
 AlignObjOutput is the output from getAlignObjs fucntion.
... ...
@@ -9,6 +9,9 @@ plotAlignmentPath(AlignObjOutput)
9 9
 \arguments{
10 10
 \item{AlignObjOutput}{(list) The list contains AlignObj, raw XICs for reference and experiment, and reference-peak label.}
11 11
 }
12
+\value{
13
+A plot to the current device.
14
+}
12 15
 \description{
13 16
 Plot aligned path through the similarity matrix. Reference run has indices on X-axis, eXp run has them on Y-axis.
14 17
 In getAlignObjs function, objType must be set to medium.
... ...
@@ -37,6 +37,9 @@ plotAnalyteXICs(analyte, run, dataPath = ".", maxFdrQuery = 1,
37 37
 
38 38
 \item{Title}{(logical) TRUE: name of the list will be displayed as title.}
39 39
 }
40
+\value{
41
+A plot to the current device.
42
+}
40 43
 \description{
41 44
 Plot extracted-ion chromatogram.
42 45
 }
... ...
@@ -14,6 +14,9 @@ and second column indicates intensity.}
14 14
 
15 15
 \item{peakAnnot}{(numeric) Peak-apex time.}
16 16
 }
17
+\value{
18
+A plot to the current device.
19
+}
17 20
 \description{
18 21
 Plot an aligned XIC-group.
19 22
 }