... | ... |
@@ -618,7 +618,7 @@ addData <- function(GRN, counts_peaks, normalization_peaks = "DESeq_sizeFactor", |
618 | 618 |
#' @param maxNormalizedMean_peaks Numeric or \code{NULL}. Default \code{NULL}. Maximum mean across all samples for a peak to be retained for the normalized counts table. Set to \code{NULL} for not applying the filter. |
619 | 619 |
#' @param minNormalizedMeanRNA Numeric or \code{NULL}. Default 5. Minimum mean across all samples for a gene to be retained for the normalized counts table. Set to \code{NULL} for not applying the filter. |
620 | 620 |
#' @param maxNormalizedMeanRNA Numeric or \code{NULL}. Default \code{NULL}. Maximum mean across all samples for a gene to be retained for the normalized counts table. Set to \code{NULL} for not applying the filter. |
621 |
-#' @param chrToKeep_peaks Character vector or \code{NULL}. Default \code{c(paste0("chr", 1:22), "chrX", "chrY")}. Vector of chromosomes that peaks are allowed to come from. This filter can be used to filter sex chromosomes from the peaks, for example. |
|
621 |
+#' @param chrToKeep_peaks Character vector or \code{NULL}. Default \code{NULL}. Vector of chromosomes that peaks are allowed to come from. This filter can be used to filter sex chromosomes from the peaks, for example (e.g, \code{c(paste0("chr", 1:22), "chrX", "chrY")}) |
|
622 | 622 |
#' @param minSize_peaks Integer or \code{NULL}. Default \code{NULL}. Minimum peak size (width, end - start) for a peak to be retained. Set to \code{NULL} for not applying the filter. |
623 | 623 |
#' @param maxSize_peaks Integer or \code{NULL}. Default 10000. Maximum peak size (width, end - start) for a peak to be retained. Set to \code{NULL} for not applying the filter. |
624 | 624 |
#' @param minCV_peaks Numeric or \code{NULL}. Default \code{NULL}. Minimum CV (coefficient of variation, a unitless measure of variation) for a peak to be retained. Set to \code{NULL} for not applying the filter. |
... | ... |
@@ -635,7 +635,7 @@ addData <- function(GRN, counts_peaks, normalization_peaks = "DESeq_sizeFactor", |
635 | 635 |
filterData <- function (GRN, |
636 | 636 |
minNormalizedMean_peaks = 5, maxNormalizedMean_peaks = NULL, |
637 | 637 |
minNormalizedMeanRNA = 1, maxNormalizedMeanRNA = NULL, |
638 |
- chrToKeep_peaks = c(paste0("chr", seq_len(22)), "chrX", "chrY"), |
|
638 |
+ chrToKeep_peaks = NULL, |
|
639 | 639 |
minSize_peaks = NULL, maxSize_peaks = 10000, |
640 | 640 |
minCV_peaks = NULL, maxCV_peaks = NULL, |
641 | 641 |
minCV_genes = NULL, maxCV_genes = NULL, |
... | ... |
@@ -730,7 +730,7 @@ filterData <- function (GRN, |
730 | 730 |
} |
731 | 731 |
|
732 | 732 |
if (is.null(chrToKeep)) { |
733 |
- chrToKeep = GRN@data$peaks$consensusPeaks %>% dplyr::pull(chr) %>% unique() |
|
733 |
+ chrToKeep = GRN@data$peaks$consensusPeaks %>% dplyr::pull(.data$chr) %>% unique() |
|
734 | 734 |
} else { |
735 | 735 |
futile.logger::flog.info(paste0("Filter and sort peaks and remain only those on the following chromosomes: ", paste0(chrToKeep, collapse = ","))) |
736 | 736 |
} |
... | ... |
@@ -10,7 +10,7 @@ filterData( |
10 | 10 |
maxNormalizedMean_peaks = NULL, |
11 | 11 |
minNormalizedMeanRNA = 1, |
12 | 12 |
maxNormalizedMeanRNA = NULL, |
13 |
- chrToKeep_peaks = c(paste0("chr", seq_len(22)), "chrX", "chrY"), |
|
13 |
+ chrToKeep_peaks = NULL, |
|
14 | 14 |
minSize_peaks = NULL, |
15 | 15 |
maxSize_peaks = 10000, |
16 | 16 |
minCV_peaks = NULL, |
... | ... |
@@ -31,7 +31,7 @@ filterData( |
31 | 31 |
|
32 | 32 |
\item{maxNormalizedMeanRNA}{Numeric or \code{NULL}. Default \code{NULL}. Maximum mean across all samples for a gene to be retained for the normalized counts table. Set to \code{NULL} for not applying the filter.} |
33 | 33 |
|
34 |
-\item{chrToKeep_peaks}{Character vector. Default \code{c(paste0("chr", 1:22), "chrX", "chrY")}. Vector of chromosomes that peaks are allowed to come from. This filter can be used to filter sex chromosomes from the peaks, for example.} |
|
34 |
+\item{chrToKeep_peaks}{Character vector or \code{NULL}. Default \code{NULL}. Vector of chromosomes that peaks are allowed to come from. This filter can be used to filter sex chromosomes from the peaks, for example (e.g, \code{c(paste0("chr", 1:22), "chrX", "chrY")})} |
|
35 | 35 |
|
36 | 36 |
\item{minSize_peaks}{Integer or \code{NULL}. Default \code{NULL}. Minimum peak size (width, end - start) for a peak to be retained. Set to \code{NULL} for not applying the filter.} |
37 | 37 |
|
... | ... |
@@ -36,7 +36,7 @@ performAllNetworkAnalyses( |
36 | 36 |
|
37 | 37 |
\item{communities}{Numeric vector. Default \code{seq_len(10)}. Depending on what was specified in the \code{display} parameter, this parameter would indicate either the rank or the label of the communities to be plotted. i.e. for \code{communities = c(1,4)}, if \code{display = "byRank"} the results for the first and fourth largest communities will be plotted. if \code{display = "byLabel"}, the results for the communities labeled \code{"1"}, and \code{"4"} will be plotted. If set to \code{NULL}, all communities will be plotted} |
38 | 38 |
|
39 |
-\item{display}{Character. Default \code{"byRank"}. One of: \code{"byRank"}, \code{"byLabel"}. Specify whether the communities will by displayed based on their rank, where the largest community (with most vertices) would have a rank of 1, or by their label. Note that the label is independent of the rank.} |
|
39 |
+\item{display}{Character. Default \code{"byRank"}. One of: \code{"byRank"}, \code{"byLabel"}. Specify whether the communities will be displayed based on their rank, where the largest community (with most vertices) would have a rank of 1, or by their label. Note that the label is independent of the rank.} |
|
40 | 40 |
|
41 | 41 |
\item{topnGenes}{Integer. Default 20. Number of genes to plot, sorted by their rank or label.} |
42 | 42 |
|
... | ... |
@@ -30,7 +30,7 @@ plotCommunitiesEnrichment( |
30 | 30 |
|
31 | 31 |
\item{basenameOutput}{\code{NULL} or character. Default \code{NULL}. Basename of the output files that are produced. If set to \code{NULL}, a default basename is chosen. If a custom basename is specified, all output files will have the chosen basename as file prefix, be careful with not overwriting already existing files (if \code{forceRerun} is set to \code{TRUE})} |
32 | 32 |
|
33 |
-\item{display}{Character. Default \code{"byRank"}. One of: \code{"byRank"}, \code{"byLabel"}. Specify whether the communities will by displayed based on their rank, where the largest community (with most vertices) would have a rank of 1, or by their label. Note that the label is independent of the rank.} |
|
33 |
+\item{display}{Character. Default \code{"byRank"}. One of: \code{"byRank"}, \code{"byLabel"}. Specify whether the communities will be displayed based on their rank, where the largest community (with most vertices) would have a rank of 1, or by their label. Note that the label is independent of the rank.} |
|
34 | 34 |
|
35 | 35 |
\item{communities}{\code{NULL} or numeric vector. Default \code{NULL}. If set to \code{NULL}, the default, all communities enrichments that have been calculated before are plotted. If a numeric vector is specified: Depending on what was specified in the \code{display} parameter, this parameter indicates either the rank or the label of the communities to be plotted. i.e. for \code{communities = c(1,4)}, if \code{display = "byRank"} the results for the first and fourth largest communities are plotted. if \code{display = "byLabel"}, the results for the communities labeled \code{"1"}, and \code{"4"} are plotted.} |
36 | 36 |
|
... | ... |
@@ -26,7 +26,7 @@ plotCommunitiesStats( |
26 | 26 |
|
27 | 27 |
\item{basenameOutput}{\code{NULL} or character. Default \code{NULL}. Basename of the output files that are produced. If set to \code{NULL}, a default basename is chosen. If a custom basename is specified, all output files will have the chosen basename as file prefix, be careful with not overwriting already existing files (if \code{forceRerun} is set to \code{TRUE})} |
28 | 28 |
|
29 |
-\item{display}{Character. Default \code{"byRank"}. One of: \code{"byRank"}, \code{"byLabel"}. Specify whether the communities will by displayed based on their rank, where the largest community (with most vertices) would have a rank of 1, or by their label. Note that the label is independent of the rank.} |
|
29 |
+\item{display}{Character. Default \code{"byRank"}. One of: \code{"byRank"}, \code{"byLabel"}. Specify whether the communities will be displayed based on their rank, where the largest community (with most vertices) would have a rank of 1, or by their label. Note that the label is independent of the rank.} |
|
30 | 30 |
|
31 | 31 |
\item{communities}{Numeric vector. Default \code{seq_len(10)}. Depending on what was specified in the \code{display} parameter, this parameter would indicate either the rank or the label of the communities to be plotted. i.e. for \code{communities = c(1,4)}, if \code{display = "byRank"} the results for the first and fourth largest communities will be plotted. if \code{display = "byLabel"}, the results for the communities labeled \code{"1"}, and \code{"4"} will be plotted. If set to \code{NULL}, all communities will be plotted} |
32 | 32 |
|