改变R中多个箱形图的晶须长度

时间:2017-09-21 06:15:04

标签: r ggplot2 boxplot

我有一个10个变量的数据框,我把它绘制成两列。但是ggplot将胡须定义为第5和第95个perecentile。我希望像往常一样,对于这些图和异常值,每个晶须长度为Q1 - 1.5*IQR / Q3 + 1.5*IQR。在link中发布了类似的问题,但我无法使用它。任何帮助将不胜感激!!

library(ggplot2)
library(tidyr)

df <- data.frame(matrix(rnorm(2000), ncol = 10))
plot.data <- gather(df, variable, value)
# plot.data$out <- as.numeric(rep(input_data, each = nrow(x_train)))
p <- ggplot(plot.data, aes(x = 0,  y=value))
p <- p + geom_boxplot()
#p <- p + geom_point(aes(x = 0, y = test_data), color = "red") 
p <- p + facet_wrap(~variable, scales = "free_x", strip.position = 'top', ncol = 2)
p <- p + coord_flip()
p <- p + xlab("") + ylab("")
p <- p + theme(legend.position="none") + theme_bw() 
p <- p + theme(axis.text.y=element_blank(),
          axis.ticks.y=element_blank())
p

1 个答案:

答案 0 :(得分:2)

默认情况下(notched = FALSE),geom_boxplot()应该为你提供所需的胡须(Q1 - 1.5 * IQR / Q3 + 1.5 * IQR)。查看更新的问题link。虽然,这受到分位数,IQR的定义。

如果您坚持使用stat_summary手动设置它们

# geom_boxplot parameters with stat summary
f <- function(x) {
  r <- quantile(x, probs = c(0.25, 0.25, 0.5, 0.75, 0.75))
  r[[1]]<-r[[1]]-1.5*IQR(x) #ymin lower whisker, as per geom_boxplot
  r[[5]]<-r[[5]]+1.5*IQR(x) #ymax upper whisker 
  names(r) <- c("ymin", "lower", "middle", "upper", "ymax") 
  r 
}

# To subset the outlying points for plotting, 
o <- function(x) {
  r <- quantile(x, probs = c(0.25, 0.75))
  r[[1]]<-r[[1]]-1.5*IQR(x)
  r[[2]]<-r[[2]]+1.5*IQR(x)
  subset(x, x < r[[1]] | r[[2]] < x)
}

# added seed for consistency
set.seed(123)    

df <- data.frame(matrix(rnorm(2000), ncol = 10))
plot.data <- gather(df, variable, value)
# plot.data$out <- as.numeric(rep(input_data, each = nrow(x_train)))
p <- ggplot(plot.data, aes(x = 0,  y=value))
p <- p + stat_summary(fun.data = f, geom="boxplot")+ 
  stat_summary(fun.y = o, geom="point")
#p <- p + geom_point(aes(x = 0, y = test_data), color = "red") 
p <- p + facet_wrap(~variable, scales = "free_x", strip.position = 'top', ncol = 2)
p <- p + coord_flip()
p <- p + xlab("") + ylab("")
p <- p + theme(legend.position="none") + theme_bw() 
p <- p + theme(axis.text.y=element_blank(),
               axis.ticks.y=element_blank())