我看到了这些帖子 GGally::ggpairs plot without gridlines when plotting correlation coefficient use ggpairs to create this plot
阅读后我能够实现这个hack https://github.com/tonytonov/ggally/blob/master/R/gg-plots.r,我的情节看起来像这样
我认为这是一个很好的结果,但我不能改变颜色。
MWE就是这个
library(ggally)
# load the hack
source("ggally_mod.R")
# I saved https://github.com/tonytonov/ggally/blob/master/R/gg-plots.r as "ggally_mod.R"
assignInNamespace("ggally_cor", ggally_cor, "GGally")
ggpairs(swiss)
现在我要运行
ggpairs(swiss,
lower=list(continuous="smooth", wrap=c(colour="blue")),
diag=list(continuous="bar", wrap=c(colour="blue")))
但颜色保持不变。是否有办法改变颜色,因为params不再工作了?
答案 0 :(得分:8)
您没有正确使用wrap
-
see the vignette for details。同样对于对角线你现在必须使用函数barDiag
(但是ggpairs
给出非常有用的错误来告诉它)
因此,对于您的示例,我们可以更改较低点的colour
面板和下面栏的fill
library(GGally)
library(ggplot2)
ggpairs(swiss[1:3],
lower=list(continuous=wrap("smooth", colour="blue")),
diag=list(continuous=wrap("barDiag", fill="blue")))
然而,由于光滑的颜色是硬编码的(见ggally_smooth
),要更改它
您需要定义自己要传递的函数的颜色。所以from here
my_fn <- function(data, mapping, pts=list(), smt=list(), ...){
ggplot(data = data, mapping = mapping, ...) +
do.call(geom_point, pts) +
do.call(geom_smooth, smt)
}
# Plot
ggpairs(swiss[1:4],
lower = list(continuous =
wrap(my_fn,
pts=list(size=2, colour="red"),
smt=list(method="lm", se=F, size=5, colour="blue"))),
diag=list(continuous=wrap("barDiag", fill="blue")))
以类似的方式,这里有一种定义新的上相关函数的方法(类似于你所拥有的)
cor_fun <- function(data, mapping, method="pearson", ndp=2, sz=5, stars=TRUE, ...){
data <- na.omit(data[,c(as.character(mapping$x), as.character(mapping$y))])
x <- data[,as.character(mapping$x)]
y <- data[,as.character(mapping$y)]
corr <- cor.test(x, y, method=method)
est <- corr$estimate
lb.size <- sz* abs(est)
if(stars){
stars <- c("***", "**", "*", "")[findInterval(corr$p.value, c(0, 0.001, 0.01, 0.05, 1))]
lbl <- paste0(round(est, ndp), stars)
}else{
lbl <- round(est, ndp)
}
ggplot(data=data, mapping=mapping) +
annotate("text", x=mean(x), y=mean(y), label=lbl, size=lb.size,...)+
theme(panel.grid = element_blank())
}
ggpairs(swiss,
lower=list(continuous=wrap("smooth", colour="blue")),
diag=list(continuous=wrap("barDiag", fill="blue")),
upper=list(continuous=cor_fun))
答案 1 :(得分:2)
您可以使用wrap()
as explained here修改GGally函数的某些参数。但并非所有参数都以wrap
的名称命名。例如,如果您尝试使用wrap
内的手动色阶更改默认调色板,则可能会出现Error in wrap("cor",…) all parameters must be named arguments
之类的错误。在这种情况下,您可以构建custom functions以生成适合矩阵图的上部,下部或对角线部分的任何类型的ggplot对象。
但是,如果您想要更改某些参数(未在GGally函数中命名为wrap
ped)而没有创建自定义函数来设计ggplot对象,则会有一个(更安全)的快捷方式。您只需在函数调用中调用已存在的GGally函数,添加额外的ggplot参数。例如,要为三个类别(在新列swiss $ groups中)提供手动缩放颜色:
swiss$groups <- gl(n = 3, k = 1, length = nrow(swiss), labels = c("A", "B", "C"))
ggpairs(swiss, mapping = aes(colour = groups), columns = 1:6,
upper = list(continuous = function(data, mapping, ...) {
ggally_cor(data = data, mapping = mapping, size = 2) + scale_colour_manual(values = c("black", "dark green", "red"))}),
lower = list(continuous = function(data, mapping, ...) {
ggally_smooth(data = data, mapping = mapping, alpha = .2) + scale_colour_manual(values = c("black", "dark green", "red"))}),
diag = list(continuous = function(data, mapping, ...) {
ggally_barDiag(data = data, mapping = mapping, alpha = .5) + scale_fill_manual(values = c("black", "dark green", "red"))}))