Skip to content

Commit

Permalink
Remarks regarding JOSS paper #34
Browse files Browse the repository at this point in the history
update corr_matrix
  • Loading branch information
PHS-Meantrix committed Feb 18, 2025
1 parent a0646b7 commit 19f4f94
Show file tree
Hide file tree
Showing 2 changed files with 5 additions and 5 deletions.
8 changes: 4 additions & 4 deletions R/corr_matrix.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,7 @@
#' @param col \[\code{character(1)}]\cr Specifies the column to be used in the correlation matrix.
#' @param isig \[\code{logical(1)}]\cr Determines whether values that are not statistically significant
#' should be represented by NA or FALSE in the correlation matrix.
#' @param ... Additional arguments (TODO).
#' @param ... Not used. Included for S3 method consistency.
#'
#' @author Igor D.S. Siciliani, Paulo H. dos Santos
#'
Expand All @@ -29,16 +29,16 @@ corr_matrix <- function(c, ...) {
corr_matrix.default <- function(c, col = c("infer.value", "stat.value", "isig"), isig = TRUE, ...) {
warning("The provided object is not of class 'clist'; some results may be incorrect.")

.corr_matrix(c = c, col = col, isig = isig, ...)
.corr_matrix(c = c, col = col, isig = isig)
}

#' @export
#' @rdname corr_matrix
corr_matrix.clist <- function(c, col = c("infer.value", "stat.value", "isig"), isig = TRUE, ...) {
.corr_matrix(c = c, col = col, isig = isig, ...)
.corr_matrix(c = c, col = col, isig = isig)
}

.corr_matrix <- function(c, col = c("infer.value", "stat.value", "isig"), isig = TRUE, ...) {
.corr_matrix <- function(c, col = c("infer.value", "stat.value", "isig"), isig = TRUE) {
checkmate::assert_names(names(c), identical.to = c("data", "index"))
checkmate::assert_logical(isig, len = 1)
stopifnot(all(unique(c$index$i) == unique(c$index$j)))
Expand Down
2 changes: 1 addition & 1 deletion man/corr_matrix.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 19f4f94

Please sign in to comment.