... | ... |
@@ -1,6 +1,6 @@ |
1 | 1 |
Package: GRaNIE |
2 | 2 |
Title: GRaNIE: Reconstruction cell type specific gene regulatory networks including enhancers using chromatin accessibility and RNA-seq data |
3 |
-Version: 0.99.2 |
|
3 |
+Version: 0.99.3 |
|
4 | 4 |
Encoding: UTF-8 |
5 | 5 |
Authors@R: c(person("Christian", "Arnold", email = |
6 | 6 |
"chrarnold@web.de", role = c("cre","aut")), |
... | ... |
@@ -1731,7 +1731,7 @@ AR_classification_wrapper<- function (GRN, significanceThreshold_Wilcoxon = 0.05 |
1731 | 1731 |
#' @examples |
1732 | 1732 |
#' # See the Workflow vignette on the GRaNIE website for examples |
1733 | 1733 |
#' GRN = loadExampleObject() |
1734 |
-#' GRN = addConnections_TF_peak(GRN, outputFolder = ".", forceRerun = FALSE) |
|
1734 |
+#' GRN = addConnections_TF_peak(GRN, plotDiagnosticPlots = FALSE, forceRerun = FALSE) |
|
1735 | 1735 |
#' @export |
1736 | 1736 |
addConnections_TF_peak <- function (GRN, plotDiagnosticPlots = TRUE, plotDetails = FALSE, outputFolder = NULL, |
1737 | 1737 |
corMethod = "pearson", |
... | ... |
@@ -2277,8 +2277,7 @@ addConnections_TF_peak <- function (GRN, plotDiagnosticPlots = TRUE, plotDetails |
2277 | 2277 |
#' @examples |
2278 | 2278 |
#' # See the Workflow vignette on the GRaNIE website for examples |
2279 | 2279 |
#' GRN = loadExampleObject() |
2280 |
-#' types = list(c("protein_coding")) |
|
2281 |
-#' GRN = addConnections_peak_gene(GRN, promoterRange=10000, outputFolder=".", plotGeneTypes=types) |
|
2280 |
+#' GRN = addConnections_peak_gene(GRN, promoterRange=10000, plotDiagnosticPlots = FALSE) |
|
2282 | 2281 |
addConnections_peak_gene <- function(GRN, overlapTypeGene = "TSS", corMethod = "pearson", |
2283 | 2282 |
promoterRange = 250000, TADs = NULL, |
2284 | 2283 |
nCores = 4, |
... | ... |
@@ -3937,7 +3936,7 @@ loadExampleObject <- function(forceDownload = FALSE, fileURL = "https://www.embl |
3937 | 3936 |
if (!length(rid)) { |
3938 | 3937 |
rid <- names(BiocFileCache::bfcadd(bfc, "GRaNIE_object_example", fileURL)) |
3939 | 3938 |
} |
3940 |
- if (isFALSE(BiocFileCache::bfcneedsupdate(bfc, rid)) | forceDownload) { |
|
3939 |
+ if (!isFALSE(BiocFileCache::bfcneedsupdate(bfc, rid)) | forceDownload) { |
|
3941 | 3940 |
messageStr = paste0("Downloading GRaNIE example object from ", fileURL) |
3942 | 3941 |
message(messageStr) |
3943 | 3942 |
filePath = BiocFileCache::bfcdownload(bfc, rid, ask = FALSE) |
... | ... |
@@ -16,8 +16,8 @@ |
16 | 16 |
#' @return The same \code{\linkS4class{GRN}} object, without modifications. In addition, for each specified \code{type}, a PDF file is produced with a PCA. We refer to the Vignettes for details and further explanations. |
17 | 17 |
#' @examples |
18 | 18 |
#' # See the Workflow vignette on the GRaNIE website for examples |
19 |
-#' GRN = loadExampleObject() |
|
20 |
-#' GRN = plotPCA_all(GRN, topn = 500, outputFolder = ".", type = "rna", plotAsPDF=FALSE) |
|
19 |
+#' # GRN = loadExampleObject() |
|
20 |
+#' # GRN = plotPCA_all(GRN, topn = 500, type = "rna", plotAsPDF = FALSE) |
|
21 | 21 |
#' @export |
22 | 22 |
plotPCA_all <- function(GRN, outputFolder = NULL, basenameOutput = NULL, |
23 | 23 |
type = c("rna", "peaks"), topn = c(500,1000,5000), |
... | ... |
@@ -809,7 +809,7 @@ plotDiagnosticPlots_TFPeaks <- function(GRN, |
809 | 809 |
#' # See the Workflow vignette on the GRaNIE website for examples |
810 | 810 |
#' # GRN = loadExampleObject() |
811 | 811 |
#' # types = list(c("protein_coding")) |
812 |
-#' # GRN = plotDiagnosticPlots_peakGene(GRN, outputFolder=".", gene.types=types, plotAsPDF=FALSE) |
|
812 |
+#' # GRN = plotDiagnosticPlots_peakGene(GRN, gene.types=types, plotAsPDF = FALSE) |
|
813 | 813 |
#' @export |
814 | 814 |
# TODO: implement forceRerun correctly |
815 | 815 |
plotDiagnosticPlots_peakGene <- function(GRN, |
... | ... |
@@ -1599,7 +1599,7 @@ plotDiagnosticPlots_peakGene <- function(GRN, |
1599 | 1599 |
#' @examples |
1600 | 1600 |
#' # See the Workflow vignette on the GRaNIE website for examples |
1601 | 1601 |
#' GRN = loadExampleObject() |
1602 |
-#' GRN = plot_stats_connectionSummary(GRN, outputFolder = ".", forceRerun = FALSE, plotAsPDF=FALSE) |
|
1602 |
+#' GRN = plot_stats_connectionSummary(GRN, forceRerun = FALSE, plotAsPDF = FALSE) |
|
1603 | 1603 |
#' @export |
1604 | 1604 |
#' @importFrom circlize colorRamp2 |
1605 | 1605 |
plot_stats_connectionSummary <- function(GRN, type = "heatmap", |
... | ... |
@@ -1931,7 +1931,7 @@ plot_stats_connectionSummary <- function(GRN, type = "heatmap", |
1931 | 1931 |
#' @examples |
1932 | 1932 |
#' # See the Workflow vignette on the GRaNIE website for examples |
1933 | 1933 |
#' GRN = loadExampleObject() |
1934 |
-#' GRN = plotGeneralGraphStats(GRN, outputFolder = ".", plotAsPDF=FALSE) |
|
1934 |
+#' GRN = plotGeneralGraphStats(GRN, plotAsPDF = FALSE) |
|
1935 | 1935 |
#' @export |
1936 | 1936 |
plotGeneralGraphStats <- function(GRN, outputFolder = NULL, basenameOutput = NULL, |
1937 | 1937 |
plotAsPDF = TRUE, pdf_width = 12, pdf_height = 12, |
... | ... |
@@ -2097,7 +2097,7 @@ plotGeneralGraphStats <- function(GRN, outputFolder = NULL, basenameOutput = NUL |
2097 | 2097 |
#' @examples |
2098 | 2098 |
#' # See the Workflow vignette on the GRaNIE website for examples |
2099 | 2099 |
#' GRN = loadExampleObject() |
2100 |
-#' GRN = plotGeneralEnrichment(GRN, outputFolder = ".", plotAsPDF=FALSE) |
|
2100 |
+#' GRN = plotGeneralEnrichment(GRN, plotAsPDF = FALSE) |
|
2101 | 2101 |
#' @export |
2102 | 2102 |
plotGeneralEnrichment <- function(GRN, outputFolder = NULL, basenameOutput = NULL, |
2103 | 2103 |
ontology = NULL, topn_pvalue = 30, p = 0.05, |
... | ... |
@@ -2276,7 +2276,7 @@ plotGeneralEnrichment <- function(GRN, outputFolder = NULL, basenameOutput = NUL |
2276 | 2276 |
#' @examples |
2277 | 2277 |
#' # See the Workflow vignette on the GRaNIE website for examples |
2278 | 2278 |
#' GRN = loadExampleObject() |
2279 |
-#' GRN = plotCommunitiesStats(GRN, outputFolder = ".", plotAsPDF=FALSE) |
|
2279 |
+#' GRN = plotCommunitiesStats(GRN, plotAsPDF = FALSE) |
|
2280 | 2280 |
#' @export |
2281 | 2281 |
plotCommunitiesStats <- function(GRN, outputFolder = NULL, basenameOutput = NULL, |
2282 | 2282 |
display = "byRank", communities = seq_len(10), |
... | ... |
@@ -2446,7 +2446,7 @@ plotCommunitiesStats <- function(GRN, outputFolder = NULL, basenameOutput = NULL |
2446 | 2446 |
#' @examples |
2447 | 2447 |
#' # See the Workflow vignette on the GRaNIE website for examples |
2448 | 2448 |
#' GRN = loadExampleObject() |
2449 |
-#' GRN = plotCommunitiesEnrichment(GRN, outputFolder = ".", plotAsPDF=FALSE) |
|
2449 |
+#' GRN = plotCommunitiesEnrichment(GRN, plotAsPDF = FALSE) |
|
2450 | 2450 |
#' @export |
2451 | 2451 |
#' @import ggplot2 |
2452 | 2452 |
#' @importFrom grid gpar |
... | ... |
@@ -2760,7 +2760,7 @@ plotCommunitiesEnrichment <- function(GRN, outputFolder = NULL, basenameOutput = |
2760 | 2760 |
#' @examples |
2761 | 2761 |
#' # See the Workflow vignette on the GRaNIE website for examples |
2762 | 2762 |
#' GRN = loadExampleObject() |
2763 |
-#' GRN = plotTFEnrichment(GRN, n = 5, outputFolder = ".", plotAsPDF=FALSE) |
|
2763 |
+#' GRN = plotTFEnrichment(GRN, n = 5, plotAsPDF = FALSE) |
|
2764 | 2764 |
#' @export |
2765 | 2765 |
#' @importFrom grid gpar |
2766 | 2766 |
plotTFEnrichment <- function(GRN, rankType = "degree", n = NULL, TF.names = NULL, |