-
Notifications
You must be signed in to change notification settings - Fork 2.1k
Open
Description
I think it would be nice to add a dplyr example that doesn't make use of the args
argument like:
xyends_at_means <- function(data){data |> mutate(xend = mean(x, na.rm = T, yend = mean(y, na.rm = T)}
ggplot(mtcars) +
aes(x = wt, mpg,
color = factor(cyl)) +
geom_point() +
stat_manual(geom = "segment",
fun = xyends_at_means)
Or replace one of the existing examples - I think there are 2 examples that both use dplyr + args+vars.
Metadata
Metadata
Assignees
Labels
No labels