geom_rect() ignores the alpha argument?

Hi,

Found something that works, but probably not the most elegant solution :slight_smile:

library('tidyverse')
tibble(x = rnorm(100), y = rnorm(100)) %>% 
  ggplot(aes(x = x, y = y)) +
  geom_vline(xintercept = 0) +
  geom_hline(yintercept = 0) +
  geom_rect(data = data.frame(x = 0, y = 0), aes(xmin = -2, xmax = 2, ymin = -2, ymax = 2),
            fill = "palegreen", colour = "black", alpha = 0.5) +
  geom_point(size = 3, alpha = 0.5) +
  theme_bw() +
  coord_fixed(xlim = c(-4, 4), ylim = c(-4, 4))

PJ