In ggplot2, why are bars not centered on ticks when position is dodged?
library(tidyverse)
library(palmerpenguins)
penguins |>
group_by(species, sex) |>
summarise(body_mass_g = mean(body_mass_g)) |>
ggplot() +
geom_col(aes(y = body_mass_g, x = species, fill = sex),
width = 0.9,
position = position_dodge(0.9, preserve = "single")
)