library(tidyverse)
ggplot(cars) +
aes(dist, speed) +
geom_point(size = 7) +
aes(color = speed) +
scale_color_viridis_c(limits = c(0,26)) +
scale_x_continuous(limits = c(0,125)) +
scale_y_continuous(limits = c(0,25))
data:image/s3,"s3://crabby-images/4b722/4b722b2832d20486170a95ef7bf2e9067198c78c" alt=""
data_filter <- function(keep) {
structure(list(keep_specification = rlang::enquo(keep)),
class = "wipeobs")
}
ggplot_add.wipeobs <- function(object, plot, object_name) {
new_data <- dplyr::filter(plot$data,
!! object$keep_specification)
plot$data <- new_data
plot
}
last_plot() +
data_filter(keep = dist > 60)
data:image/s3,"s3://crabby-images/3843c/3843c36400b1fed7f5b7db2bd7064c798604d5a9" alt=""
ggplot(cars) +
aes(dist, speed) +
geom_point(size = 7) +
aes(color = speed)
data:image/s3,"s3://crabby-images/849ee/849ee92ac6876f17949fecb377955fb963fdc7af" alt=""
data_replace <- function(data) {
structure(list(new_data_specification = data),
class = "wipedata")
}
ggplot_add.wipedata <- function(object, plot, object_name) {
plot$data <- object$new_data_specification
plot
}
last_plot() +
data_replace(data = cars %>% filter(dist > 50))
data:image/s3,"s3://crabby-images/9c2cf/9c2cfc774465e6ebc74ed7b051b92135921e20a9" alt=""
drob_funs <- readr::read_csv('https://raw.githubusercontent.com/rfordatascience/tidytuesday/master/data/2024/2024-07-09/drob_funs.csv')
drob_funs %>%
ggplot() +
aes(y = funs) +
aes(y = fct_infreq(funs)) +
aes(y = fct_infreq(funs) %>% fct_rev()) +
geom_bar() ->
p; p
data:image/s3,"s3://crabby-images/139bb/139bb27f12cd776dfe8d5003d097162cc2cc7196" alt=""
p +
data_replace(drob_funs %>%
group_by(funs) %>%
filter(n() > 500))
data:image/s3,"s3://crabby-images/d1bbf/d1bbf09d5fd198bd9c1de11956724b3ae31ec970" alt=""
p +
data_filter(pkgs == "ggplot")
data:image/s3,"s3://crabby-images/40064/400646f39ca11b8f0a9c950720e98b3d7f1d46e5" alt=""
p +
data_filter(pkgs == "dplyr")
data:image/s3,"s3://crabby-images/d2b36/d2b36eb1b040805edc8d8f4162263cafc422e295" alt=""
p +
data_filter(pkgs == "tidyr")
data:image/s3,"s3://crabby-images/fd346/fd34606735a98dd700c9e6005db002baa22de3b7" alt=""
p +
data_filter(pkgs == "base")
data:image/s3,"s3://crabby-images/9f941/9f9417b2993ad5f5c197895413ef5a255c2956ec" alt=""
# might not work
data_group <- function(group) {
structure(list(group_specification = rlang::enquo(group)),
class = "data_grouping")
}
ggplot_add.data_grouping <- function(object, plot, object_name) {
new_data <- dplyr::group_by(plot$data,
!! object$group_specification)
plot$data <- new_data
plot
}
p +
data_group() +
data_filter(n() > 500)
data:image/s3,"s3://crabby-images/139bb/139bb27f12cd776dfe8d5003d097162cc2cc7196" alt=""
data_mutate <- function(.value, .by) {
structure(list(sum_specification = rlang::enquo(.value),
by_specification = rlang::enquo(.by)),
class = "data_summary")
}
ggplot_add.data_summary <- function(object, plot, object_name) {
new_data <- dplyr::mutate(plot$data, .value =
!! object$sum_specification,
.by = !! object$by_specification)
message("New variable named '.value' created")
plot$data <- new_data
plot
}
p +
data_mutate(.value = n(),
.by = funs) +
data_filter(.value > 500)
data:image/s3,"s3://crabby-images/d1bbf/d1bbf09d5fd198bd9c1de11956724b3ae31ec970" alt=""
drob_funs %>%
ggplot() +
aes(id = funs) +
ggcirclepack::geom_circlepack() +
ggcirclepack::geom_circlepack_text() +
coord_equal() +
aes(fill = I("grey")) ->
plot_all
plot_all +
data_filter(pkgs == "ggplot")
data:image/s3,"s3://crabby-images/fcab5/fcab547f17c12e181075578c4a0853e0bbdda285" alt=""
plot_all +
data_filter(pkgs == "base")
data:image/s3,"s3://crabby-images/c5242/c524264f03d7f22a4cfaed8eb05e47fbd8749e75" alt=""
plot_all +
data_filter(pkgs == "tidyr")
data:image/s3,"s3://crabby-images/b9e1d/b9e1dee893dcf04051d5e04c2d35358f985e8817" alt=""
plot_all +
data_filter(pkgs == "dplyr")
data:image/s3,"s3://crabby-images/ca670/ca670287c5d4b72c1d082dc3a26e790f85cd50e1" alt=""
plot_all +
data_filter(pkgs == "stringr")
data:image/s3,"s3://crabby-images/45586/45586d718bc7e711003764c82792f0635b4470bb" alt=""
library(tidyverse)
drob_funs <- readr::read_csv('https://raw.githubusercontent.com/rfordatascience/tidytuesday/master/data/2024/2024-07-09/drob_funs.csv')
data_mutate_filter <- function(.value, .by, keep) {
structure(list(sum_specification = rlang::enquo(.value),
by_specification = rlang::enquo(.by),
keep_specifiction = rlang::enquo(keep)),
class = "data_mutatefilter")
}
ggplot_add.data_mutatefilter <- function(object, plot, object_name) {
new_data <- dplyr::mutate(plot$data, .value =
!! object$sum_specification,
.by = !! object$by_specification) %>%
dplyr::filter(!! object$keep_specifiction)
message("New variable named '.value' created")
plot$data <- new_data
plot
}
drob_funs %>%
ggplot() +
aes(id = paste(funs, pkgs)) +
ggcirclepack::geom_circlepack() +
ggcirclepack::geom_circlepack_text(aes(label = funs)) +
coord_equal() +
aes(fill = pkgs) +
guides(fill = "none")
data:image/s3,"s3://crabby-images/36e78/36e78ada8ceed23cf1dce9d5ba97d77e7f0def5a" alt=""
last_plot() +
data_mutate_filter(.value = n(),
.by = c(funs, pkgs),
keep = .value >= 200)
data:image/s3,"s3://crabby-images/854e3/854e37fabde775c0967038412526a1f4cfea672c" alt=""
last_plot() +
aes(group = pkgs)
data:image/s3,"s3://crabby-images/cce1a/cce1a814c498e89c7e2a660d01b3cf570f9b3369" alt=""
# ggcirclepack:::StatCirclepack$compute_panel
#
# StatCirclepack <- ggcirclepack:::StatCirclepack
# StatCirclepack$compute_panel <- function (data, scales, npoints = 50, fun = sum)
# {
# if (is.null(data$slice)) {
# data$slice <- TRUE
# }
# data <- data %>% dplyr::filter(.data$slice)
# grp_cols <- c("id", "fill", "alpha", "colour", "linewidth",
# "label", "size", "linetype", "render")
# data <- data %>% group_by(group_by(pick(any_of(grp_cols))))
# if (is.null(data$area)) {
# data$area <- 1
# }
# if (is.null(data$wt)) {
# data$wt <- 1
# }
# data <- data %>% summarize(area = fun(.data$area * .data$wt),
# .groups = "drop")
# data <- data %>% arrange(id)
# if (is.null(data$within)) {
# data$within <- 1
# }
# data <- data %>% group_by(.data$within) %>% mutate(prop = .data$area/sum(.data$area)) %>%
# mutate(percent = round(.data$prop * 100))
# data$id = 1:nrow(data)
# data %>% pull(area) %>% packcircles::circleProgressiveLayout(sizetype = "area") %>%
# packcircles::circleLayoutVertices(npoints = npoints) %>%
# left_join(data, by = join_by(id))
# }
Intro Thoughts
Status Quo
library(tidyverse)
ggplot(cars) +
aes(dist, speed) +
geom_point(size = 7) +
aes(color = speed) +
scale_color_viridis_c(limits = c(0,26)) +
scale_x_continuous(limits = c(0,125)) +
scale_y_continuous(limits = c(0,25))
data:image/s3,"s3://crabby-images/4b722/4b722b2832d20486170a95ef7bf2e9067198c78c" alt=""
# last_plot() %>% `%+%`(cars)
#
# update_data <- `%+%`
# last_plot() |>
# update_data(cars %>% filter(dist > 20))
last_plot_update_data <- function(p = last_plot(), data){
p$data <- data
p
}
last_plot_update_data(data = cars %>% filter(speed > 10))
data:image/s3,"s3://crabby-images/76ed8/76ed8be6289dfdbb70cb00be6be202ee9f3dc989" alt=""
last_plot_filter_data <- function(p = last_plot(), keep){
p$data <- p$data %>% filter({{keep}})
p
}
last_plot_filter_data(keep = dist > 40)
data:image/s3,"s3://crabby-images/02f99/02f992c447aeef7b5f5081827f9f349cd6ec1c32" alt=""
#The {magrittr} piping with . returns a function (of the 'functional sequence' subclass), so that kicks off the 'function as data' clause of the data documention.
#You could probably do something like the following to allow that in data_replace() too:
library(tidyverse)
ggplot_add.wipedata <- function(object, plot, object_name) {
new <- object$new_data_specifiction
if (is.function(new)) {
new <- new(plot$data)
}
plot$data <- new
plot
}
data_replace <- function(data) {
structure(list(new_data_specification = data),
class = "wipedata")
}
circle_packing_data <- data.frame(x = abs(rnorm(100)), id = 1:100)
circle_packing_data %>%
ggplot(data = .) +
aes(area = x, id = id) +
ggcirclepack::geom_circlepack()
data:image/s3,"s3://crabby-images/c2b78/c2b78413cd0ec0d3d909db49ad388e30211c458d" alt=""
last_plot() +
data_replace(data = circle_packing_data %>% mutate(x = sort(x)))
## Error in panels[[1]]: subscript out of bounds
last_plot() +
data_replace(data = . %>% mutate(x = sort(x)))
## Error in panels[[1]]: subscript out of bounds
ggplot_add.wipedata <- function(object, plot, object_name) {
plot$data <- object$new_data_specification
plot
}
last_plot() +
data_replace(data = circle_packing_data %>% mutate(x = sort(x)))
data:image/s3,"s3://crabby-images/b2263/b2263a4838798d4b72baaba5fd38445b4cdc19af" alt=""
last_plot() +
data_replace(data = circle_packing_data %>% mutate(x = rev(sort(x))))
data:image/s3,"s3://crabby-images/cec07/cec07b558b4b20ddc6e6e0cbc9fc5a571067924f" alt=""
last_plot() %+%
(. %>% mutate(x = sort(x)))
## Error in `ggplot_add()`:
## ! Can't add `(. %>% mutate(x = sort(x)))` to a <ggplot> object
## ℹ Did you forget to add parentheses, as in `(. %>% mutate(x = sort(x)))()`?