使用 facet_grid 在 ggplot 中自动设置数据代表中断

Posted

技术标签:

【中文标题】使用 facet_grid 在 ggplot 中自动设置数据代表中断【英文标题】:Automatically set data representative breaks in ggplot with facet_grid 【发布时间】:2021-07-14 17:51:30 【问题描述】:

这是取自the R Graph Gallery的可复制示例:

library(ggplot2)
library(dplyr) 
library(viridis) 
library(Interpol.T) 
library(lubridate) 
library(ggExtra) 
library(tidyr) 


data <- data(Trentino_hourly_T,package = "Interpol.T")

names(h_d_t)[1:5]<- c("stationid","date","hour","temp","flag")
df <- as_tibble(h_d_t) %>%
  filter(stationid =="T0001")

df$date<-ymd(df$date)

df <- df %>% mutate(date = ymd(date),
                    year = year(date),
                    month = month(date, label=TRUE),
                    day = day(date))

rm(list=c("h_d_t","mo_bias","Tn","Tx",
          "Th_int_list","calibration_l",
          "calibration_shape","Tm_list"))

df <- df %>%
  filter(between(date, as.Date("2004-02-13"), as.Date("2004-04-29")) | between(date, as.Date("2005-02-13"), as.Date("2005-04-29")))

df <-df %>% select(stationid,day,hour,month,year,temp)%>%
  fill(temp)

statno <-unique(df$stationid)


######## Plotting starts here#####################
p <-ggplot(df, aes(day,hour,fill=temp))+
  geom_tile(color= "white",size=0.1) + 
  scale_fill_viridis(name="Hrly Temps C",option ="C") + 
  facet_grid(year~month, scales = "free") +
  scale_y_continuous(trans = "reverse", breaks = unique(df$hour)) + 
  theme_minimal(base_size = 8) + 
  labs(title= paste("Hourly Temps - Station",statno), x="Day", y="Hour Commencing") + 
  theme(legend.position = "bottom",
        plot.title=element_text(size = 14, hjust = 0),
        axis.text.y=element_text(size=6),
        strip.background = element_rect(colour="white"),
        axis.ticks=element_blank(),
        axis.text=element_text(size=7),
        legend.text=element_text(size=6))+
  removeGrid()

困扰我的是,x 轴中断没有明确显示每个月的第一天和最后一天,更糟糕的是它们显示了 2 月 30 日、3 月 0 日和 4 月 0 日。

我的目标是使用一个函数来自动且明确地显示每个绘制月份的真实第一天和最后一天(在示例中为 2 月 13 日至 2 月 29 日、3 月 1 日至 3 月 31 日和 4 月 1 日至 4 月 29 日),其中 4 到每个月有 6 次休息。

由于此图将显示在闪亮的应用程序中,用户可以在其中更改绘制的时间段,因此解决方案确实需要自动化。

以下是我尝试过的一些事情:

library(scales)
p + scale_x_continuous(breaks =breaks_pretty())

但变化不大。

我尝试编写自己的函数,但发生了可怕的事情:

breaksFUN <- function(x)
  round(seq(min(x), max(x), length.out = 5), 0)


p + scale_x_continuous(breaks =breaksFUN)

提前谢谢你。

【问题讨论】:

可能类似于:breaksFUN &lt;- function(x) c(round(seq(min(x) + 0.5, max(x) - 5.5, length.out = 4)), max(x) - 0.5) ,然后是p + scale_x_continuous(breaks = breaksFUN, expand = c(0, 0)) 【参考方案1】:

感谢 Axeman 的贡献,它真的很有帮助!它适用于我的示例,但我在我的数据中尝试它时遇到了一些问题。但是,我对其进行了修改,现在它可以正常工作了,这是我受 Axeman 启发的解决方案:

breaksFUN <- function(x) 
  s <- round(c(seq(min(x) + 1.5, max(x) - 5.5, length.out = 4), max(x) - 1.5))
  s[s == 0] <- 1
  s[s > 31] <- 31
  s <- round(seq(range(s)[1], range(s)[2], length.out = 5))
  unique(s)


p + scale_x_continuous(breaks = breaksFUN)

【讨论】:

以上是关于使用 facet_grid 在 ggplot 中自动设置数据代表中断的主要内容,如果未能解决你的问题,请参考以下文章

ggplot:如何使用 facet_grid 创建不同的 x 轴标题

如何使用 ggplot_build 和 ggplot_gtable 调整 facet_grid 框架和箱线图之间的距离

ggplot2:从图中删除未使用的因子水平组合的方面(facet_grid)

如何使用不同的几何图形将边际总计添加到 ggplot2 facet_grid 图

在 ggplot2 facet_grid 中旋转切换的构面标签

R:ggplot2:facet_grid:如何在少数(不是全部)标签中包含数学表达式?