Experiment
library(tidyverse)
compute_panel_pairs <- function(data, scales){
data %>%
mutate(group_label = group) %>%
group_by(group) %>%
arrange(x) %>%
mutate(change = y - lag(y) ) %>%
fill(change, .direction = "up")
}
StatPairs <- ggproto("StatPairs", Stat,
compute_panel = compute_panel_pairs,
default_aes = aes(color = after_stat(change)))
gapminder::gapminder %>%
filter(year %in% c(1992, 2002)) %>%
ggplot() +
aes(x = year,
y = gdpPercap,
group = country) +
geom_point(stat = StatPairs) +
geom_path(stat = StatPairs)
data:image/s3,"s3://crabby-images/a3d78/a3d78770bed1bf3b8a919ba6933676c4860f51b7" alt=""
last_plot() +
geom_text(
stat = StatPairs,
aes(label = country),
hjust = "outward",
check_overlap = T
)
data:image/s3,"s3://crabby-images/e7f73/e7f73cbd7041d7e2540b5f03220a25a8ddab08ff" alt=""
last_plot() +
aes(x = as.factor(year))
data:image/s3,"s3://crabby-images/04532/04532d7de22b70f75cb8e6699aa5384862eb17c5" alt=""
last_plot() +
stat_summary(geom = "point",
fun = "mean",
aes(group = NULL,
color = I("goldenrod") # why do I have to do this? When I have color *set* above?
),
size = 4)
data:image/s3,"s3://crabby-images/9539d/9539d1ba8369ff2b854cb5ab17aed57f7a0bf30b" alt=""
last_plot() +
aes(color = sign(after_stat(change)))
data:image/s3,"s3://crabby-images/05d89/05d892f2fd6e157d2935be11bbe72ef8628eca6d" alt=""
ggwipe::last_plot_wipe_last() +
stat_summary(geom = "point",
color = "goldenrod",
fun = "mean",
aes(group = NULL,
color = I("goldenrod")
),
size = 4)
data:image/s3,"s3://crabby-images/05d89/05d892f2fd6e157d2935be11bbe72ef8628eca6d" alt=""
last_plot() +
aes(y = lifeExp)
data:image/s3,"s3://crabby-images/884b5/884b59990d9316cb0fd1ca84d2f17e4684476aea" alt=""
last_plot() +
aes(color = I("grey"))
data:image/s3,"s3://crabby-images/035ad/035ad6a5566f05b1eefe65d0d5572fdb12696cdd" alt=""
StatSummary$compute_layer
## <ggproto method>
## <Wrapper function>
## function (...)
## compute_layer(..., self = self)
##
## <Inner function (f)>
## function (self, data, params, layout)
## {
## check_required_aesthetics(self$required_aes, c(names(data),
## names(params)), snake_class(self))
## required_aes <- intersect(names(data), unlist(strsplit(self$required_aes,
## "|", fixed = TRUE)))
## data <- remove_missing(data, params$na.rm, c(required_aes,
## self$non_missing_aes), snake_class(self), finite = TRUE)
## params <- params[intersect(names(params), self$parameters())]
## args <- c(list(data = quote(data), scales = quote(scales)),
## params)
## dapply(data, "PANEL", function(data) {
## scales <- layout$get_scales(data$PANEL[1])
## try_fetch(inject(self$compute_panel(data = data, scales = scales,
## !!!params)), error = function(cnd) {
## cli::cli_warn("Computation failed in {.fn {snake_class(self)}}.",
## parent = cnd)
## data_frame0()
## })
## })
## }