-
Notifications
You must be signed in to change notification settings - Fork 2.1k
Open
Labels
messagesrequests for improvements to error, warning, or feedback messagesrequests for improvements to error, warning, or feedback messages
Description
Hi Teun,
is there a way to produce pie charts with absolute dimensions without triggering a warning?
library(ggplot2)
data.frame(cat = c("A", "B", "C"), value = c(25, 40, 60)) |>
ggplot(aes(x = NA, y = value, fill = cat)) +
geom_col(position = position_stack()) +
coord_radial(theta = "y", expand = FALSE) +
theme(panel.widths = unit(50, "mm"), panel.heights = unit(50, "mm"))
Warning message:
Aspect ratios are overruled by `panel.widths` and `panel.heights` theme elements.
At the moment these warnings are spoiling my package tests 🙃
Best
Broder
Metadata
Metadata
Assignees
Labels
messagesrequests for improvements to error, warning, or feedback messagesrequests for improvements to error, warning, or feedback messages