R/draw_correlogram.R

Defines functions draw_correlogram

Documented in draw_correlogram

#' @name draw_correlogram
#' @title Correlogram
#' @author Nicolas Mangin
#' @description Function creating a correlogram of scores.
#' @param scores Tibble. Table showing the different scores associated to various observations.
#' @return A ggplot object ready for rendering.
#' @importFrom dplyr select_if
#' @importFrom ggcorrplot cor_pmat
#' @importFrom ggcorrplot ggcorrplot
#' @export

draw_correlogram <- function(scores){
  scores <- dplyr::select_if(scores, base::is.numeric)
  scores <- scores[,(base::apply(scores, 2, stats::sd) != 0)]
  corr <- base::round(stats::cor(scores, method = "kendall"), 2)
  p.mat <- ggcorrplot::cor_pmat(scores)
  ggcorrplot::ggcorrplot(
    corr,
    p.mat = p.mat,
    show.diag = TRUE,
    show.legend = FALSE,
    hc.order = TRUE,
    sig.level = 0.10,
    type = "full",
    insig = "blank",
    colors = c("red", "white", "forestgreen"),
    outline.col = "white"
  )
}
NicolasJBM/chartR documentation built on Sept. 13, 2024, 12:31 p.m.