繁体   English   中英

ggplot中GLM的多个比较的输出

[英]Output of multiple comparisons for GLM in ggplot

我想在ggplot中可视化GLM的多个比较的输出。 在我的示例中:

#Simulation data set
set.seed(123)
d<-NULL
N<-54
d$Production <- rgamma(N,10)
d$Feature <- ifelse(d$Production >7 & d$Production<10, c("A"),ifelse(d$Production>11, 
c("B"), c("C")))  
#d$Temp<-rnorm(N,20,5)
d$Temp<-rep(1:3,18)
d<-as.data.frame(d)
#

# Gamma glm model
mG<- glm(Production~ Feature + Temp, family= Gamma, data = d)
summary(mG)
anova(mG,test="Chi")

#If for example a have interaction between Temp and Feature
d$BV <- interaction(d$Feature, d$Temp)

# GLM fit
mI  <- glm(Production ~ -1 + BV, data = d, family = "Gamma")
#summary(glht(mI, linfct = mcp(BV = "Tukey")))
cld(glht(mI, linfct = mcp(BV = "Tukey")))


# Prediction values
pred.data = data.frame(
Feature<-d$Feature,
Temp<-d$Temp
)  
pred.data$Production = predict(mG, newdata=pred.data, type="response")

# Select means
library(dplyr)
d2<-d %>%
  group_by(Feature, Temp) %>%
  summarize(Production = mean(Production, na.rm = TRUE))

#Final plot
library("ggplot2")
ggplot(d2, aes(Temp, Production, colour = Feature)) +
  geom_point() +
  stat_smooth(method = "glm", formula = y ~ x, family = Gamma)
#

现在,我想在ggplot中可视化输出的cld(glht(mI,linfct = mcp(BV =“ Tukey”)))的字母:

输出

这个有可能? 谢谢

尝试这个:

library(tidyverse)

res <- cld(glht(mI, linfct = mcp(BV = "Tukey")))

d2 <-
  res$mcletters$Letters %>%
  tibble(
    reg = names(.),
    lett = .
  ) %>%
  mutate(
    Feature = substr(reg, 1, 1),
    Temp = substr(reg, 3, 3) %>% as.integer()
  ) %>%
  left_join(d2) %>%
  mutate(lett_pos = if_else(Feature == 'C', Production - .5, Production + .5))

ggplot(d2, aes(Temp, Production, colour = Feature)) +
  geom_point() +
  stat_smooth(method = "glm", formula = y ~ x) +
  geom_text(aes(y = lett_pos, label = lett), color = 'black')

在此处输入图片说明

暂无
暂无

声明:本站的技术帖子网页,遵循CC BY-SA 4.0协议,如果您需要转载,请注明本站网址或者原文地址。任何问题请咨询:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM