... | ... |
@@ -10,7 +10,9 @@ |
10 | 10 |
#' @importFrom ggplot2 ggplot |
11 | 11 |
#' @importFrom AnnotationDbi Term |
12 | 12 |
#' |
13 |
-#' |
|
13 |
+#' @examples |
|
14 |
+#' ncGO <- geneGOEnricher(gene = brain_disorder_ncRNA[1:100,], |
|
15 |
+#' org_assembly='hg19', near=TRUE, genetype = 'Ensembl_gene') |
|
14 | 16 |
#' |
15 | 17 |
#' @export |
16 | 18 |
drawDotPlot <- function(mrnaObject, type = "pAdjust", n) { |
... | ... |
@@ -85,7 +87,10 @@ drawDotPlot <- function(mrnaObject, type = "pAdjust", n) { |
85 | 87 |
#' |
86 | 88 |
#' @importFrom utils browseURL read.table write.table |
87 | 89 |
#' |
88 |
-#' |
|
90 |
+#' @examples |
|
91 |
+#' ncGO <- geneGOEnricher(gene = brain_disorder_ncRNA[1:100,], |
|
92 |
+#' org_assembly='hg19', near=TRUE, genetype = 'Ensembl_gene') |
|
93 |
+#' |
|
89 | 94 |
#' @export |
90 | 95 |
writeEnrichment <- |
91 | 96 |
function(mrnaObject, |
... | ... |
@@ -122,7 +127,7 @@ writeEnrichment <- |
122 | 127 |
#' |
123 | 128 |
#' @return Give top n enrichment results |
124 | 129 |
#' |
125 |
-#' |
|
130 |
+#' |
|
126 | 131 |
#' @export |
127 | 132 |
topEnrichment <- function(mrnaObject, type, n) { |
128 | 133 |
if (missing(mrnaObject)) { |
... | ... |
@@ -241,6 +246,10 @@ topEnrichment <- function(mrnaObject, type, n) { |
241 | 246 |
#' @importFrom ggplot2 aes element_text geom_point ggplot labs theme theme_bw |
242 | 247 |
#' |
243 | 248 |
#' |
249 |
+#' @examples |
|
250 |
+#' ncGO <- geneGOEnricher(gene = brain_disorder_ncRNA[1:100,], |
|
251 |
+#' org_assembly='hg19', near=TRUE, genetype = 'Ensembl_gene') |
|
252 |
+#' |
|
244 | 253 |
#' @export |
245 | 254 |
createNetwork <- |
246 | 255 |
function(mrnaObject, |
... | ... |
@@ -375,7 +384,10 @@ createNetwork <- |
375 | 384 |
#' @importFrom png readPNG writePNG |
376 | 385 |
#' @importFrom RCurl postForm |
377 | 386 |
#' |
378 |
-#' |
|
387 |
+#' @examples |
|
388 |
+#' ncGO <- geneGOEnricher(gene = brain_disorder_ncRNA[1:100,], |
|
389 |
+#' org_assembly='hg19', near=TRUE, genetype = 'Ensembl_gene') |
|
390 |
+#' |
|
379 | 391 |
#' @export |
380 | 392 |
getGoDag <- |
381 | 393 |
function(mrnaObject, |
... | ... |
@@ -39,3 +39,8 @@ Nodes are GO term and mRNA, edges are interactions between them. Each |
39 | 39 |
GO-term is annotated and enriched with the mRNAs provided from the input |
40 | 40 |
list. |
41 | 41 |
} |
42 |
+\examples{ |
|
43 |
+ncGO <- geneGOEnricher(gene = brain_disorder_ncRNA[1:100,], |
|
44 |
+ org_assembly='hg19', near=TRUE, genetype = 'Ensembl_gene') |
|
45 |
+ |
|
46 |
+} |
... | ... |
@@ -30,3 +30,8 @@ Saves image file in a given format |
30 | 30 |
Plot and save the GO term DAG of the top n enrichments in terms of p-values |
31 | 31 |
or adjusted p-values with an user provided format |
32 | 32 |
} |
33 |
+\examples{ |
|
34 |
+ncGO <- geneGOEnricher(gene = brain_disorder_ncRNA[1:100,], |
|
35 |
+ org_assembly='hg19', near=TRUE, genetype = 'Ensembl_gene') |
|
36 |
+ |
|
37 |
+} |
... | ... |
@@ -26,3 +26,8 @@ Text file of the enrichment results in a tabular format |
26 | 26 |
\description{ |
27 | 27 |
Write the tabular form of the pathway or GO term enrichment results |
28 | 28 |
} |
29 |
+\examples{ |
|
30 |
+ncGO <- geneGOEnricher(gene = brain_disorder_ncRNA[1:100,], |
|
31 |
+ org_assembly='hg19', near=TRUE, genetype = 'Ensembl_gene') |
|
32 |
+ |
|
33 |
+} |