... | ... |
@@ -18,6 +18,9 @@ |
18 | 18 |
#' transitions in RawData. Variable Intensity is required to be original signal |
19 | 19 |
#' without any log transformation and can be specified as the peak of height |
20 | 20 |
#' or the peak of area under curve. |
21 |
+#' @examples |
|
22 |
+#' data(example_dia_skyline) |
|
23 |
+#' head(example_dia_skyline) |
|
21 | 24 |
#' |
22 | 25 |
NULL |
23 | 26 |
|
... | ... |
@@ -31,6 +34,9 @@ NULL |
31 | 34 |
#' @docType data |
32 | 35 |
#' |
33 | 36 |
#' @format data.frame |
37 |
+#' @examples |
|
38 |
+#' data(example_skyline_annotation) |
|
39 |
+#' head(example_skyline_annotation) |
|
34 | 40 |
#' |
35 | 41 |
NULL |
36 | 42 |
|
... | ... |
@@ -45,6 +51,9 @@ NULL |
45 | 51 |
#' @docType data |
46 | 52 |
#' |
47 | 53 |
#' @format list |
54 |
+#' @examples |
|
55 |
+#' data(dia_skyline_summarized) |
|
56 |
+#' head(dia_skyline_summarized) |
|
48 | 57 |
#' |
49 | 58 |
NULL |
50 | 59 |
|
... | ... |
@@ -60,6 +69,9 @@ NULL |
60 | 69 |
#' @docType data |
61 | 70 |
#' |
62 | 71 |
#' @format list |
72 |
+#' @examples |
|
73 |
+#' data(dia_skyline_model) |
|
74 |
+#' head(dia_skyline_model) |
|
63 | 75 |
#' |
64 | 76 |
NULL |
65 | 77 |
|
... | ... |
@@ -74,6 +86,9 @@ NULL |
74 | 86 |
#' @docType data |
75 | 87 |
#' |
76 | 88 |
#' @format list |
89 |
+#' @examples |
|
90 |
+#' data(tmt_pd_summarized) |
|
91 |
+#' head(tmt_pd_summarized) |
|
77 | 92 |
#' |
78 | 93 |
NULL |
79 | 94 |
|
... | ... |
@@ -89,5 +104,8 @@ NULL |
89 | 104 |
#' @docType data |
90 | 105 |
#' |
91 | 106 |
#' @format list |
107 |
+#' @examples |
|
108 |
+#' data(tmt_pd_model) |
|
109 |
+#' head(tmt_pd_model) |
|
92 | 110 |
#' |
93 | 111 |
NULL |
94 | 112 |
\ No newline at end of file |
... | ... |
@@ -13,9 +13,8 @@ |
13 | 13 |
#' @param testMode One of TRUE or FALSE indicating whether or not to run the |
14 | 14 |
#' application in test mode. Default is FALSE. |
15 | 15 |
#' @examples |
16 |
-#' |
|
17 |
-#' ## To run app set launch_app=TRUE |
|
18 | 16 |
#' \dontrun{ |
17 |
+#' ## To run app set launch_app=TRUE |
|
19 | 18 |
#' launch_MSstatsShiny(launch_app=FALSE,testMode=FALSE) |
20 | 19 |
#' } |
21 | 20 |
launch_MSstatsShiny = function(launch_app=TRUE, |
... | ... |
@@ -12,6 +12,34 @@ |
12 | 12 |
#' @param busy_indicator Boolean indicator indicating whether or not to display |
13 | 13 |
#' shiny waiting indicator. |
14 | 14 |
#' @return list of LF Summarization results |
15 |
+#' @examples |
|
16 |
+#' data("example_dia_skyline") |
|
17 |
+#' data("example_skyline_annotation") |
|
18 |
+#' testdata = MSstats::SkylinetoMSstatsFormat(example_dia_skyline, |
|
19 |
+#' annotation = example_skyline_annotation, |
|
20 |
+#' filter_with_Qvalue = TRUE, |
|
21 |
+#' qvalue_cutoff = 0.01, |
|
22 |
+#' fewMeasurements="remove", |
|
23 |
+#' removeProtein_with1Feature = TRUE, |
|
24 |
+#' use_log_file = FALSE) |
|
25 |
+#' |
|
26 |
+#' ## Source app functionality |
|
27 |
+#' qc_input = list() |
|
28 |
+#' loadpage_input = list() |
|
29 |
+#' qc_input$norm = "equalizeMedians" |
|
30 |
+#' qc_input$log = 2 |
|
31 |
+#' qc_input$names = NULL |
|
32 |
+#' qc_input$features_used = "all" |
|
33 |
+#' code_n_feat=3 |
|
34 |
+#' qc_input$censInt = "NA" |
|
35 |
+#' qc_input$MBi = TRUE |
|
36 |
+#' qc_input$remove50 = FALSE |
|
37 |
+#' qc_input$maxQC = 0.999 |
|
38 |
+#' qc_input$null = FALSE |
|
39 |
+#' qc_input$null1 = FALSE |
|
40 |
+#' loadpage_input$DDA_DIA = "LF" |
|
41 |
+#' lf_summarization_loop(testdata, qc_input,loadpage_input, busy_indicator=FALSE) |
|
42 |
+#' |
|
15 | 43 |
lf_summarization_loop = function(data, qc_input,loadpage_input, busy_indicator = TRUE){ |
16 | 44 |
if (busy_indicator){ |
17 | 45 |
show_modal_progress_line() # show the modal window |
... | ... |
@@ -96,6 +124,37 @@ lf_summarization_loop = function(data, qc_input,loadpage_input, busy_indicator = |
96 | 124 |
#' shiny waiting indicator. |
97 | 125 |
#' |
98 | 126 |
#' @return list of TMT summarization results |
127 |
+#' @examples |
|
128 |
+#' data(raw.pd, package = "MSstatsTMT") |
|
129 |
+#' data(annotation.pd, package = "MSstatsTMT") |
|
130 |
+#' |
|
131 |
+#' testdata <- MSstatsTMT::PDtoMSstatsTMTFormat(raw.pd, |
|
132 |
+#' annotation.pd, |
|
133 |
+#' use_log_file = FALSE |
|
134 |
+#' ) |
|
135 |
+#' |
|
136 |
+#' qc_input = list() |
|
137 |
+#' loadpage_input = list() |
|
138 |
+#' qc_input$summarization = "msstats" |
|
139 |
+#' qc_input$norm = "equalizeMedians" |
|
140 |
+#' qc_input$log = 2 |
|
141 |
+#' qc_input$names = NULL |
|
142 |
+#' qc_input$features_used = "all" |
|
143 |
+#' code_n_feat=3 |
|
144 |
+#' qc_input$censInt = "NA" |
|
145 |
+#' qc_input$MBi = TRUE |
|
146 |
+#' qc_input$remove50 = FALSE |
|
147 |
+#' qc_input$maxQC = 0.999 |
|
148 |
+#' qc_input$null = FALSE |
|
149 |
+#' qc_input$null1 = FALSE |
|
150 |
+#' loadpage_input$DDA_DIA = "LF" |
|
151 |
+#' qc_input$global_norm = TRUE |
|
152 |
+#' qc_input$reference_norm = TRUE |
|
153 |
+#' qc_input$remove_norm_channel = TRUE |
|
154 |
+#' qc_input$maxQC1 = NULL |
|
155 |
+#' summarization_tmt_test = tmt_summarization_loop(testdata, qc_input,loadpage_input, |
|
156 |
+#' busy_indicator = FALSE) |
|
157 |
+#' |
|
99 | 158 |
tmt_summarization_loop = function(data, qc_input,loadpage_input, busy_indicator = TRUE){ |
100 | 159 |
MBimpute = FALSE ## Add option for MBimpute to server.. |
101 | 160 |
MSstatsConvert::MSstatsLogsSettings(FALSE, |
... | ... |
@@ -232,6 +291,16 @@ tmt_summarization_loop = function(data, qc_input,loadpage_input, busy_indicator |
232 | 291 |
#' shiny waiting indicator. |
233 | 292 |
#' |
234 | 293 |
#' @return list of LF modeling results |
294 |
+#' @examples |
|
295 |
+#' data("dia_skyline_summarized") |
|
296 |
+#' comparison <- matrix(c(1, -1, 0, 0, 0, 0, 0, 0, 0, 0),nrow=1) |
|
297 |
+#' row.names(comparison) = "1 vs 128" |
|
298 |
+#' colnames(comparison) = c("1", "128", "16", "2", "256", |
|
299 |
+#' "32", "4", "512", "64", "8") |
|
300 |
+#' model_lf_test = lf_model(dia_skyline_summarized, comparison, |
|
301 |
+#' busy_indicator = FALSE) |
|
302 |
+#' |
|
303 |
+#' |
|
235 | 304 |
lf_model = function(data, contrast.matrix, busy_indicator = TRUE){ |
236 | 305 |
|
237 | 306 |
proteins = as.character(unique(data$ProteinLevelData[, 'Protein'])) |
... | ... |
@@ -299,6 +368,46 @@ lf_model = function(data, contrast.matrix, busy_indicator = TRUE){ |
299 | 368 |
#' shiny waiting indicator. |
300 | 369 |
#' |
301 | 370 |
#' @return list of TMT modeling results |
371 |
+#' @examples |
|
372 |
+#' data(raw.pd, package = "MSstatsTMT") |
|
373 |
+#' data(annotation.pd, package = "MSstatsTMT") |
|
374 |
+#' |
|
375 |
+#' testdata <- MSstatsTMT::PDtoMSstatsTMTFormat(raw.pd, |
|
376 |
+#' annotation.pd, |
|
377 |
+#' use_log_file = FALSE |
|
378 |
+#' )#' |
|
379 |
+#' |
|
380 |
+#' qc_input = list() |
|
381 |
+#' loadpage_input = list() |
|
382 |
+#' qc_input$summarization = "msstats" |
|
383 |
+#' qc_input$norm = "equalizeMedians" |
|
384 |
+#' qc_input$log = 2 |
|
385 |
+#' qc_input$names = NULL |
|
386 |
+#' qc_input$features_used = "all" |
|
387 |
+#' code_n_feat=3 |
|
388 |
+#' qc_input$censInt = "NA" |
|
389 |
+#' qc_input$MBi = TRUE |
|
390 |
+#' qc_input$remove50 = FALSE |
|
391 |
+#' qc_input$maxQC = 0.999 |
|
392 |
+#' qc_input$null = FALSE |
|
393 |
+#' qc_input$null1 = FALSE |
|
394 |
+#' loadpage_input$DDA_DIA = "LF" |
|
395 |
+#' qc_input$global_norm = TRUE |
|
396 |
+#' qc_input$reference_norm = TRUE |
|
397 |
+#' qc_input$remove_norm_channel = TRUE |
|
398 |
+#' qc_input$maxQC1 = NULL |
|
399 |
+#' qc_input$moderated = FALSE |
|
400 |
+#' |
|
401 |
+#' summarization_tmt_test = tmt_summarization_loop(testdata, qc_input, loadpage_input, |
|
402 |
+#' busy_indicator = FALSE) |
|
403 |
+#' |
|
404 |
+#' comparison=matrix(c(-1,0,0,1),nrow=1) |
|
405 |
+#' row.names(comparison) = "1-0.125" |
|
406 |
+#' colnames(comparison) = c("0.125", "0.5", "0.667", "1") |
|
407 |
+#' |
|
408 |
+#' model_tmt_test = tmt_model(summarization_tmt_test, qc_input, comparison, |
|
409 |
+#' busy_indicator = FALSE) |
|
410 |
+#' |
|
302 | 411 |
tmt_model = function(data, input, contrast.matrix, busy_indicator = TRUE){ |
303 | 412 |
|
304 | 413 |
proteins = as.character(unique(data$ProteinLevelData[, 'Protein'])) |
... | ... |
@@ -366,6 +475,11 @@ tmt_model = function(data, input, contrast.matrix, busy_indicator = TRUE){ |
366 | 475 |
#' @param protein_model output of MSstats modeling function modeling unmodified proteins |
367 | 476 |
#' |
368 | 477 |
#' @return list of PTM modeling results |
478 |
+#' @examples |
|
479 |
+#' model = MSstatsPTM::groupComparisonPTM(MSstatsPTM::summary.data, |
|
480 |
+#' data.type = "LabelFree") |
|
481 |
+#' apply_adj(model$PTM.Model, model$PROTEIN.Model) |
|
482 |
+#' |
|
369 | 483 |
apply_adj = function(ptm_model, protein_model){ |
370 | 484 |
|
371 | 485 |
Label = Site = NULL |
... | ... |
@@ -406,6 +520,10 @@ apply_adj = function(ptm_model, protein_model){ |
406 | 520 |
#' @param qc_input options for data processing input by the user from data processing page. |
407 | 521 |
#' @param loadpage_input options for data processing input by the user from data upload page. |
408 | 522 |
#' @return string |
523 |
+#' @examples |
|
524 |
+#' qc_input = list(null=TRUE) |
|
525 |
+#' loadpage_input = list(null=TRUE) |
|
526 |
+#' QC_check(qc_input,loadpage_input) |
|
409 | 527 |
QC_check = function(qc_input,loadpage_input) { |
410 | 528 |
if (qc_input$null == TRUE || qc_input$null1 == TRUE) { |
411 | 529 |
maxQC = NULL |
... | ... |
@@ -434,6 +552,8 @@ QC_check = function(qc_input,loadpage_input) { |
434 | 552 |
#' @param trigger how should prompt be shown |
435 | 553 |
#' @param options additional options to pass to function |
436 | 554 |
#' @return HTML object |
555 |
+#' @examples |
|
556 |
+#' radioTooltip("testid", "test_choice", "test_title") |
|
437 | 557 |
radioTooltip = function(id, choice, title, placement = "bottom", |
438 | 558 |
trigger = "hover", options = NULL){ |
439 | 559 |
|
... | ... |
@@ -83,6 +83,11 @@ |
83 | 83 |
#' @importFrom graphics image mtext par plot.new |
84 | 84 |
#' @importFrom stats dist hclust qt |
85 | 85 |
#' @importFrom utils read.table write.table |
86 |
+#' @examples |
|
87 |
+#' data("dia_skyline_model") |
|
88 |
+#' groupComparisonPlots2(dia_skyline_model$ComparisonResult, type="VolcanoPlot", |
|
89 |
+#' address=FALSE) |
|
90 |
+#' |
|
86 | 91 |
groupComparisonPlots2 = function(data=data, |
87 | 92 |
type=type, |
88 | 93 |
sig=0.05, |
... | ... |
@@ -73,50 +73,4 @@ server <- function(input, output, session) { |
73 | 73 |
observeEvent(input$"home-Reset", { |
74 | 74 |
refresh() |
75 | 75 |
}) |
76 |
-} |
|
77 |
- |
|
78 |
-# shinyServer(function(input, output, session) { |
|
79 |
-# options(shiny.maxRequestSize=10000*1024^2) |
|
80 |
-# session$allowReconnect(TRUE) |
|
81 |
-# observe({ |
|
82 |
-# toggleClass(condition = TRUE, |
|
83 |
-# class = "disabled", |
|
84 |
-# selector = "#tablist li a[data-value='Data processing']") |
|
85 |
-# }) |
|
86 |
-# |
|
87 |
-# observeEvent(input$"statmodel-Design", { |
|
88 |
-# updateTabsetPanel(session = session, inputId = "tablist", selected = "Future") |
|
89 |
-# }) |
|
90 |
-# observeEvent(input$"home-StartPipeline", { |
|
91 |
-# updateTabsetPanel(session = session, inputId = "tablist", selected = "Uploaddata") |
|
92 |
-# }) |
|
93 |
-# |
|
94 |
-# loadpage_input <- loadpageServer("loadpage", parent_session = session) |
|
95 |
-# qc_input <- callModule(qcServer, "qc",session, reactive(loadpage_input)) |
|
96 |
-# statmodel_input <- callModule(statmodelServer, "statmodel",session, reactive(loadpage_input),reactive(qc_input)) |
|
97 |
-# callModule(expdesServer, "expdes",session, reactive(loadpage_input),reactive(qc_input),reactive(statmodel_input)) |
|
98 |
-# observeEvent(input$proceed, { |
|
99 |
-# updateTabsetPanel(session = session, inputId = "tablist", selected = "Uploaddata") |
|
100 |
-# }) |
|
101 |
-# |
|
102 |
-# # statmodel= reactiveFileReader(1000, session, "panels/statmodel-ui.R", source) |
|
103 |
-# # output$statmodel = renderUI(statmodel()) |
|
104 |
-# # |
|
105 |
-# observe({ |
|
106 |
-# if(input$"loadpage-DDA_DIA" %in% c("TMT", "PTM")){ |
|
107 |
-# hideTab(inputId = "tablist", target = "PQ") |
|
108 |
-# hideTab(inputId = "tablist", target = "Future") |
|
109 |
-# } |
|
110 |
-# |
|
111 |
-# if(!(input$"loadpage-DDA_DIA" %in% c("TMT", "PTM"))){ |
|
112 |
-# showTab(inputId = "tablist", target = "PQ") |
|
113 |
-# showTab(inputId = "tablist", target = "Future") |
|
114 |
-# } |
|
115 |
-# }) |
|
116 |
-# |
|
117 |
-# observeEvent(input$"home-Reset", { |
|
118 |
-# refresh() |
|
119 |
-# }) |
|
120 |
-# |
|
121 |
-# } |
|
122 |
-# ) |
|
76 |
+} |
|
123 | 77 |
\ No newline at end of file |
... | ... |
@@ -17,3 +17,9 @@ list of PTM modeling results |
17 | 17 |
\description{ |
18 | 18 |
Main PTM function to model MSstatsShiny data. |
19 | 19 |
} |
20 |
+\examples{ |
|
21 |
+model = MSstatsPTM::groupComparisonPTM(MSstatsPTM::summary.data, |
|
22 |
+ data.type = "LabelFree") |
|
23 |
+apply_adj(model$PTM.Model, model$PROTEIN.Model) |
|
24 |
+ |
|
25 |
+} |
... | ... |
@@ -14,3 +14,8 @@ Data includes one list with two data.tables named \code{ComparisonResult} and |
14 | 14 |
\code{ModelQC} provides a report on the quality control checks of each protein |
15 | 15 |
in the dataset. |
16 | 16 |
} |
17 |
+\examples{ |
|
18 |
+data(dia_skyline_model) |
|
19 |
+head(dia_skyline_model) |
|
20 |
+ |
|
21 |
+} |
... | ... |
@@ -13,3 +13,8 @@ Data includes one list with two data.tables named \code{FeatureLevelData} and |
13 | 13 |
shows the unsummarized feature level data. \code{ProteinLevelData} shows the data |
14 | 14 |
summarized up to the protein level and is used for modeling the data. |
15 | 15 |
} |
16 |
+\examples{ |
|
17 |
+data(dia_skyline_summarized) |
|
18 |
+head(dia_skyline_summarized) |
|
19 |
+ |
|
20 |
+} |
... | ... |
@@ -24,3 +24,8 @@ transitions in RawData. Variable Intensity is required to be original signal |
24 | 24 |
without any log transformation and can be specified as the peak of height |
25 | 25 |
or the peak of area under curve. |
26 | 26 |
} |
27 |
+\examples{ |
|
28 |
+data(example_dia_skyline) |
|
29 |
+head(example_dia_skyline) |
|
30 |
+ |
|
31 |
+} |
... | ... |
@@ -12,3 +12,8 @@ data.frame mapping Skyline run names to the corresponding bioreplicates and |
12 | 12 |
conditions. Used as input to preprocessing function, converting data into |
13 | 13 |
MSstats format. |
14 | 14 |
} |
15 |
+\examples{ |
|
16 |
+data(example_skyline_annotation) |
|
17 |
+head(example_skyline_annotation) |
|
18 |
+ |
|
19 |
+} |
... | ... |
@@ -130,3 +130,9 @@ PDF or console plot |
130 | 130 |
\description{ |
131 | 131 |
General plotting code to produce all QC plots in the application |
132 | 132 |
} |
133 |
+\examples{ |
|
134 |
+data("dia_skyline_model") |
|
135 |
+groupComparisonPlots2(dia_skyline_model$ComparisonResult, type="VolcanoPlot", |
|
136 |
+ address=FALSE) |
|
137 |
+ |
|
138 |
+} |
... | ... |
@@ -30,9 +30,8 @@ Main function to run MSstatsShiny. All other functions in this package are |
30 | 30 |
run automatically. |
31 | 31 |
} |
32 | 32 |
\examples{ |
33 |
- |
|
34 |
-## To run app set launch_app=TRUE |
|
35 | 33 |
\dontrun{ |
34 |
+## To run app set launch_app=TRUE |
|
36 | 35 |
launch_MSstatsShiny(launch_app=FALSE,testMode=FALSE) |
37 | 36 |
} |
38 | 37 |
} |
... | ... |
@@ -20,3 +20,14 @@ list of LF modeling results |
20 | 20 |
\description{ |
21 | 21 |
Main LF function to model MSstatsShiny data. |
22 | 22 |
} |
23 |
+\examples{ |
|
24 |
+data("dia_skyline_summarized") |
|
25 |
+comparison <- matrix(c(1, -1, 0, 0, 0, 0, 0, 0, 0, 0),nrow=1) |
|
26 |
+row.names(comparison) = "1 vs 128" |
|
27 |
+colnames(comparison) = c("1", "128", "16", "2", "256", |
|
28 |
+ "32", "4", "512", "64", "8") |
|
29 |
+model_lf_test = lf_model(dia_skyline_summarized, comparison, |
|
30 |
+ busy_indicator = FALSE) |
|
31 |
+ |
|
32 |
+ |
|
33 |
+} |
... | ... |
@@ -22,3 +22,32 @@ list of LF Summarization results |
22 | 22 |
\description{ |
23 | 23 |
Main LF function to calculate MSstatsShiny results. |
24 | 24 |
} |
25 |
+\examples{ |
|
26 |
+data("example_dia_skyline") |
|
27 |
+data("example_skyline_annotation") |
|
28 |
+testdata = MSstats::SkylinetoMSstatsFormat(example_dia_skyline, |
|
29 |
+ annotation = example_skyline_annotation, |
|
30 |
+ filter_with_Qvalue = TRUE, |
|
31 |
+ qvalue_cutoff = 0.01, |
|
32 |
+ fewMeasurements="remove", |
|
33 |
+ removeProtein_with1Feature = TRUE, |
|
34 |
+ use_log_file = FALSE) |
|
35 |
+ |
|
36 |
+## Source app functionality |
|
37 |
+qc_input = list() |
|
38 |
+loadpage_input = list() |
|
39 |
+qc_input$norm = "equalizeMedians" |
|
40 |
+qc_input$log = 2 |
|
41 |
+qc_input$names = NULL |
|
42 |
+qc_input$features_used = "all" |
|
43 |
+code_n_feat=3 |
|
44 |
+qc_input$censInt = "NA" |
|
45 |
+qc_input$MBi = TRUE |
|
46 |
+qc_input$remove50 = FALSE |
|
47 |
+qc_input$maxQC = 0.999 |
|
48 |
+qc_input$null = FALSE |
|
49 |
+qc_input$null1 = FALSE |
|
50 |
+loadpage_input$DDA_DIA = "LF" |
|
51 |
+lf_summarization_loop(testdata, qc_input,loadpage_input, busy_indicator=FALSE) |
|
52 |
+ |
|
53 |
+} |
... | ... |
@@ -22,3 +22,44 @@ list of TMT modeling results |
22 | 22 |
\description{ |
23 | 23 |
Main TMT function to model MSstatsShiny data. |
24 | 24 |
} |
25 |
+\examples{ |
|
26 |
+data(raw.pd, package = "MSstatsTMT") |
|
27 |
+data(annotation.pd, package = "MSstatsTMT") |
|
28 |
+ |
|
29 |
+testdata <- MSstatsTMT::PDtoMSstatsTMTFormat(raw.pd, |
|
30 |
+ annotation.pd, |
|
31 |
+ use_log_file = FALSE |
|
32 |
+ )#' |
|
33 |
+ |
|
34 |
+qc_input = list() |
|
35 |
+loadpage_input = list() |
|
36 |
+qc_input$summarization = "msstats" |
|
37 |
+qc_input$norm = "equalizeMedians" |
|
38 |
+qc_input$log = 2 |
|
39 |
+qc_input$names = NULL |
|
40 |
+qc_input$features_used = "all" |
|
41 |
+code_n_feat=3 |
|
42 |
+qc_input$censInt = "NA" |
|
43 |
+qc_input$MBi = TRUE |
|
44 |
+qc_input$remove50 = FALSE |
|
45 |
+qc_input$maxQC = 0.999 |
|
46 |
+qc_input$null = FALSE |
|
47 |
+qc_input$null1 = FALSE |
|
48 |
+loadpage_input$DDA_DIA = "LF" |
|
49 |
+qc_input$global_norm = TRUE |
|
50 |
+qc_input$reference_norm = TRUE |
|
51 |
+qc_input$remove_norm_channel = TRUE |
|
52 |
+qc_input$maxQC1 = NULL |
|
53 |
+qc_input$moderated = FALSE |
|
54 |
+ |
|
55 |
+summarization_tmt_test = tmt_summarization_loop(testdata, qc_input, loadpage_input, |
|
56 |
+ busy_indicator = FALSE) |
|
57 |
+ |
|
58 |
+comparison=matrix(c(-1,0,0,1),nrow=1) |
|
59 |
+row.names(comparison) = "1-0.125" |
|
60 |
+colnames(comparison) = c("0.125", "0.5", "0.667", "1") |
|
61 |
+ |
|
62 |
+model_tmt_test = tmt_model(summarization_tmt_test, qc_input, comparison, |
|
63 |
+ busy_indicator = FALSE) |
|
64 |
+ |
|
65 |
+} |
... | ... |
@@ -13,3 +13,8 @@ Data includes one list with two data.tables named \code{FeatureLevelData} and |
13 | 13 |
data. \code{ProteinLevelData} shows the data summarized up to the protein level |
14 | 14 |
and is used for modeling the data. |
15 | 15 |
} |
16 |
+\examples{ |
|
17 |
+data(tmt_pd_summarized) |
|
18 |
+head(tmt_pd_summarized) |
|
19 |
+ |
|
20 |
+} |
... | ... |
@@ -22,3 +22,35 @@ list of TMT summarization results |
22 | 22 |
\description{ |
23 | 23 |
Main TMT function to calculate MSstatsShiny results. |
24 | 24 |
} |
25 |
+\examples{ |
|
26 |
+data(raw.pd, package = "MSstatsTMT") |
|
27 |
+data(annotation.pd, package = "MSstatsTMT") |
|
28 |
+ |
|
29 |
+testdata <- MSstatsTMT::PDtoMSstatsTMTFormat(raw.pd, |
|
30 |
+ annotation.pd, |
|
31 |
+ use_log_file = FALSE |
|
32 |
+ ) |
|
33 |
+ |
|
34 |
+qc_input = list() |
|
35 |
+loadpage_input = list() |
|
36 |
+qc_input$summarization = "msstats" |
|
37 |
+qc_input$norm = "equalizeMedians" |
|
38 |
+qc_input$log = 2 |
|
39 |
+qc_input$names = NULL |
|
40 |
+qc_input$features_used = "all" |
|
41 |
+code_n_feat=3 |
|
42 |
+qc_input$censInt = "NA" |
|
43 |
+qc_input$MBi = TRUE |
|
44 |
+qc_input$remove50 = FALSE |
|
45 |
+qc_input$maxQC = 0.999 |
|
46 |
+qc_input$null = FALSE |
|
47 |
+qc_input$null1 = FALSE |
|
48 |
+loadpage_input$DDA_DIA = "LF" |
|
49 |
+qc_input$global_norm = TRUE |
|
50 |
+qc_input$reference_norm = TRUE |
|
51 |
+qc_input$remove_norm_channel = TRUE |
|
52 |
+qc_input$maxQC1 = NULL |
|
53 |
+summarization_tmt_test = tmt_summarization_loop(testdata, qc_input,loadpage_input, |
|
54 |
+ busy_indicator = FALSE) |
|
55 |
+ |
|
56 |
+} |