Skip to content

Extended tools for correlation analysis and visualization.

Notifications You must be signed in to change notification settings

catherian-cat/ggcor

 
 

Folders and files

NameName
Last commit message
Last commit date

Latest commit

 
 
 
 
 
 
 
 
 
 
 
 
 
 
 
 
 
 
 
 
 

Repository files navigation

ggcor

The goal of ggcor is to provide a set of functions that can be used to visualize a correlation matrix quickly.

Installation

Now ggcor is not on cran, You can install the development version of ggcor from GitHub with:

# install.packages("devtools")
devtools::install_github("houyunhuang/ggcor")

Correlation plot

library(ggplot2)
library(ggcor)
quickcor(mtcars) + geom_square()

quickcor(mtcars, type = "upper") + geom_circle2()

quickcor(mtcars, cor.test = TRUE) +
  geom_square(data = get_data(type = "lower", show.diag = FALSE)) +
  geom_mark(data = get_data(type = "upper", show.diag = FALSE), size = 2.5) +
  geom_abline(slope = -1, intercept = 12)

Mantel test plot

library(dplyr)
data("varechem", package = "vegan")
data("varespec", package = "vegan")

mantel <- mantel_test(varespec, varechem,
                      spec.select = list(Spec01 = 1:7,
                                         Spec02 = 8:18,
                                         Spec03 = 19:37,
                                         Spec04 = 38:44)) %>% 
  mutate(rd = cut(r, breaks = c(-Inf, 0.2, 0.4, Inf),
                  labels = c("< 0.2", "0.2 - 0.4", ">= 0.4")),
         pd = cut(p.value, breaks = c(-Inf, 0.01, 0.05, Inf),
                  labels = c("< 0.01", "0.01 - 0.05", ">= 0.05")))

quickcor(varechem, type = "upper") +
  geom_square() +
  anno_link(aes(colour = pd, size = rd), data = mantel) +
  scale_size_manual(values = c(0.5, 1, 2)) +
  scale_colour_manual(values = c("#D95F02", "#1B9E77", "#A2A2A288")) +
  guides(size = guide_legend(title = "Mantel's r",
                             override.aes = list(colour = "grey35"), 
                             order = 2),
         colour = guide_legend(title = "Mantel's p", 
                               override.aes = list(size = 3), 
                               order = 1),
         fill = guide_colorbar(title = "Pearson's r", order = 3))

Circular heatmap

rand_correlate(100, 8) %>% ## require ambient packages
  quickcor(circular = TRUE, cluster = TRUE, open = 45) +
  geom_colour(colour = "white", size = 0.125) +
  anno_row_tree() +
  anno_col_tree() +
  set_p_xaxis() +
  set_p_yaxis()

General heatmap

dd <- rand_dataset(10, 120) %>% 
  gcor_tbl(cluster = TRUE)
dd1 <- rand_dataset(3, 120, col.names = LETTERS[1:3]) %>% 
  gcor_tbl(cluster = TRUE, "LETTERS")
dd2 <- rand_dataset(10, 3, row.names = letters[1:3]) %>% 
  gcor_tbl(cluster = TRUE, "letters")
quickcor(dd, inner = 1.2, outer = 0.8, open = 60, circular = TRUE) +
  geom_colour(aes(fill = value), colour = NA) +
  anno_row_heat(dd1, aes(fill0 = LETTERS), width = 1.2) +
  anno_col_heat(dd2, aes(colour = letters), height = 1.2, geom = "point") +
  anno_row_tree(bcols = c("#E41A1C", "#377EB8", "#4DAF4A")) +
  anno_col_tree() +
  set_p_xaxis(size = 2.8) +
  set_p_yaxis(size = 2.8) +
  scale_fill_distiller() +
  scale_fill0_gradientn(colours = red_blue()) +
  scale_colour_viridis_b()

Citation

To cite the ggcor package in publications use:

  Houyun Huang, Lei Zhou, Jian Chen and Taiyun Wei(2020). ggcor: Extended tools for correlation analysis and visualization. R package version 0.9.7.

A BibTeX entry for LaTeX users is

  @Manual{
    entry  = "manual",
    title  = {ggcor: Extended tools for correlation analysis and visualization},
    author = {Houyun Huang, Lei Zhou, Jian Chen and Taiyun Wei},
    year   = {2020},
    note   = {R package version 0.9.7},
    url    = {https://github.com/houyunhuang/ggcor},
  }

The above citation information can be generated by calling citation("ggcor") in R.

About

Extended tools for correlation analysis and visualization.

Resources

Stars

Watchers

Forks

Releases

No releases published

Packages

No packages published

Languages

  • R 100.0%