Skip to content

Instantly share code, notes, and snippets.

@paleolimbot
Created June 18, 2019 17:18
Show Gist options
  • Star 0 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save paleolimbot/708effa39e67bb53f54f30499562587b to your computer and use it in GitHub Desktop.
Save paleolimbot/708effa39e67bb53f54f30499562587b to your computer and use it in GitHub Desktop.
library(tidyverse)
library(ggdebug)
calls_use_method <- function(expr) {
if (rlang::is_call(expr, "UseMethod")) {
TRUE
} else if (is.call(expr)) {
any(map_lgl(expr, calls_use_method))
} else {
FALSE
}
}
is_generic <- function(f) {
calls_use_method(body(f))
}
is_s3 <- function(name) {
tryCatch(isS3method(name, envir = getNamespace("ggplot2")), error = function(e) FALSE)
}
list_elipses_calls <- function(expr) {
if (is.call(expr)) {
child_elipses <- do.call(c, compact(lapply(expr, list_elipses_calls)))
uses_elipses <- any(map_lgl(expr, identical, quote(...)))
if (uses_elipses) c(list(expr), child_elipses) else child_elipses
} else {
NULL
}
}
list_elipses_calls_f <- function(f) {
list_elipses_calls(body(f))
}
summary_text <- function(...) {
f <- list(...)
uses <- tibble(
call = as.list(f$elipses_uses),
text = map_chr(call, ~paste(format(.x), collapse = "\n"))
)
link <- glue::glue("[{f$name}(...)]({ggurl(!!f$quo)})")
if(nrow(uses) > 0) {
uses_text <- paste0(" - `", uses$text, "`", collapse = "\n")
} else {
uses_text <- " - (`...` is not used)"
}
glue::glue("
- {link}
{uses_text}
")
}
funcs <- tibble(
quo = ggeverything(),
name = map_chr(quo, as_label),
func = map(quo, ggdebug:::find_ggplot_function),
is_generic = map_lgl(func, is_generic),
is_method = map_lgl(name, is_s3),
has_elipses = map_lgl(func, function(f) {
"..." %in% names(formals(f))
})
) %>%
filter(!is_generic, !is_method, has_elipses) %>%
mutate(elipses_uses = map(func, list_elipses_calls_f)) %>%
mutate(text = pmap_chr(., summary_text)) %>%
arrange(name)
funcs %>%
head() %>%
pull(text) %>%
paste(collapse = "\n") %>%
clipr::write_clip()
@paleolimbot
Copy link
Author

  • .onAttach(...)

    • (... is not used)
  • .onLoad(...)

    • grid::pathGrob(...)
  • aes(...)

    • enquos(x = x, y = y, ..., .ignore_empty = "all")
  • aes_(...)

    • list(...)
  • aes_auto(...)

    • (... is not used)
  • aes_q(...)

    • list(...)
  • aes_string(...)

    • list(...)
  • annotate(...)

    • list(...)
    • list(na.rm = na.rm, ...)
  • annotation_logticks(...)

    • list(base = base, sides = sides, scaled = scaled, short = short, mid = mid, long = long, colour = colour, size = size, linetype = linetype, alpha = alpha, ...)
  • annotation_map(...)

    • list(map = map, ...)
  • borders(...)

    • geom_polygon(aes_(~long, ~lat, group = ~group), data = df, fill = fill, colour = colour, ..., inherit.aes = FALSE)
  • collide(...)

    • dapply(data, "xmin", strategy, ..., width = width)
    • dapply(data, "xmin", strategy, ..., width = width)
  • collide2(...)

    • pos(data, width, ...)
  • coord_map(...)

    • list(...)
  • cut_interval(...)

    • cut(x, breaks(x, "width", n, length), include.lowest = TRUE, ...)
  • cut_number(...)

    • cut(x, brk, include.lowest = TRUE, ...)
  • cut_width(...)

    • cut(x, breaks, include.lowest = TRUE, right = (closed == "right"), ...)
  • dapply(...)

    • fun(cur_data, ...)
  • data_frame(...)

    • list(...)
  • data.frame(...)

    • (... is not used)
  • datetime_scale(...)

    • continuous_scale(aesthetics, name, palette = palette, breaks = breaks, minor_breaks = minor_breaks, labels = labels, guide = guide, trans = trans, ..., super = scale_class)
  • dispatch_args(...)

    • list(...)
  • element_render(...)

    • element_grob(el, ...)
  • expand_limits(...)

    • list(...)
  • find_args(...)

    • list(..., ... = NULL)
  • geom_abline(...)

    • list(na.rm = na.rm, ...)
  • geom_area(...)

    • list(na.rm = na.rm, ...)
  • geom_bar(...)

    • geom_histogram(mapping = mapping, data = data, position = position, width = width, binwidth = binwidth, ..., na.rm = na.rm, show.legend = show.legend, inherit.aes = inherit.aes)
    • list(width = width, na.rm = na.rm, ...)
  • geom_bin2d(...)

    • list(na.rm = na.rm, ...)
  • geom_blank(...)

    • list(...)
  • geom_boxplot(...)

    • list(outlier.colour = outlier.color %||% outlier.colour, outlier.fill = outlier.fill, outlier.shape = outlier.shape, outlier.size = outlier.size, outlier.stroke = outlier.stroke, outlier.alpha = outlier.alpha, notch = notch, notchwidth = notchwidth, varwidth = varwidth, na.rm = na.rm, ...)
  • geom_col(...)

    • list(width = width, na.rm = na.rm, ...)
  • geom_contour(...)

    • list(lineend = lineend, linejoin = linejoin, linemitre = linemitre, na.rm = na.rm, ...)
  • geom_count(...)

    • list(na.rm = na.rm, ...)
  • geom_crossbar(...)

    • list(fatten = fatten, na.rm = na.rm, ...)
  • geom_curve(...)

    • list(arrow = arrow, arrow.fill = arrow.fill, curvature = curvature, angle = angle, ncp = ncp, lineend = lineend, na.rm = na.rm, ...)
  • geom_density(...)

    • list(na.rm = na.rm, ...)
  • geom_density_2d(...)

    • list(lineend = lineend, linejoin = linejoin, linemitre = linemitre, na.rm = na.rm, ...)
  • geom_density2d(...)

    • list(lineend = lineend, linejoin = linejoin, linemitre = linemitre, na.rm = na.rm, ...)
  • geom_dotplot(...)

    • list(binaxis = binaxis, binwidth = binwidth, binpositions = binpositions, method = method, origin = origin, right = right, width = width, drop = drop, stackdir = stackdir, stackratio = stackratio, dotsize = dotsize, stackgroups = stackgroups, na.rm = na.rm, ...)
  • geom_errorbar(...)

    • list(na.rm = na.rm, ...)
  • geom_errorbarh(...)

    • list(na.rm = na.rm, ...)
  • geom_freqpoly(...)

    • list(na.rm = na.rm, ...)
  • geom_hex(...)

    • list(na.rm = na.rm, ...)
  • geom_histogram(...)

    • list(binwidth = binwidth, bins = bins, na.rm = na.rm, pad = FALSE, ...)
  • geom_hline(...)

    • list(na.rm = na.rm, ...)
  • geom_jitter(...)

    • list(na.rm = na.rm, ...)
  • geom_label(...)

    • list(parse = parse, label.padding = label.padding, label.r = label.r, label.size = label.size, na.rm = na.rm, ...)
  • geom_line(...)

    • list(na.rm = na.rm, ...)
  • geom_linerange(...)

    • list(na.rm = na.rm, ...)
  • geom_map(...)

    • list(map = map, na.rm = na.rm, ...)
  • geom_path(...)

    • list(lineend = lineend, linejoin = linejoin, linemitre = linemitre, arrow = arrow, na.rm = na.rm, ...)
  • geom_point(...)

    • list(na.rm = na.rm, ...)
  • geom_pointrange(...)

    • list(fatten = fatten, na.rm = na.rm, ...)
  • geom_polygon(...)

    • list(na.rm = na.rm, rule = rule, ...)
  • geom_qq(...)

    • list(distribution = distribution, dparams = dparams, na.rm = na.rm, ...)
  • geom_qq_line(...)

    • list(distribution = distribution, dparams = dparams, na.rm = na.rm, line.p = line.p, fullrange = fullrange, ...)
  • geom_quantile(...)

    • list(lineend = lineend, linejoin = linejoin, linemitre = linemitre, na.rm = na.rm, ...)
  • geom_raster(...)

    • list(hjust = hjust, vjust = vjust, interpolate = interpolate, na.rm = na.rm, ...)
  • geom_rect(...)

    • list(linejoin = linejoin, na.rm = na.rm, ...)
  • geom_ribbon(...)

    • list(na.rm = na.rm, ...)
  • geom_rug(...)

    • list(outside = outside, sides = sides, length = length, na.rm = na.rm, ...)
  • geom_segment(...)

    • list(arrow = arrow, arrow.fill = arrow.fill, lineend = lineend, linejoin = linejoin, na.rm = na.rm, ...)
  • geom_sf(...)

    • list(na.rm = na.rm, legend = if (is.character(show.legend)) show.legend else "polygon", ...)
  • geom_sf_label(...)

    • list(parse = parse, label.padding = label.padding, label.r = label.r, label.size = label.size, na.rm = na.rm, fun.geometry = fun.geometry, ...)
  • geom_sf_text(...)

    • list(parse = parse, check_overlap = check_overlap, na.rm = na.rm, fun.geometry = fun.geometry, ...)
  • geom_smooth(...)

    • list(na.rm = na.rm, se = se, ...)
  • geom_spoke(...)

    • list(na.rm = na.rm, ...)
  • geom_step(...)

    • list(direction = direction, na.rm = na.rm, ...)
  • geom_text(...)

    • list(parse = parse, check_overlap = check_overlap, na.rm = na.rm, ...)
  • geom_tile(...)

    • list(linejoin = linejoin, na.rm = na.rm, ...)
  • geom_violin(...)

    • list(trim = trim, scale = scale, draw_quantiles = draw_quantiles, na.rm = na.rm, ...)
  • geom_vline(...)

    • list(na.rm = na.rm, ...)
  • Geom$draw_panel(...)

    • self$draw_group(group, panel_params, coord, ...)
  • GeomBlank$draw_panel(...)

    • (... is not used)
  • GeomViolin$draw_group(...)

    • GeomPath$draw_panel(both, ...)
    • GeomPolygon$draw_panel(newdata, ...)
    • GeomPolygon$draw_panel(newdata, ...)
  • ggproto(...)

    • list(...)
  • ggsave(...)

    • dev(filename = filename, width = dim[1], height = dim[2], ...)
  • guide_colorbar(...)

    • list(title = title, title.position = title.position, title.theme = title.theme, title.hjust = title.hjust, title.vjust = title.vjust, label = label, label.position = label.position, label.theme = label.theme, label.hjust = label.hjust, label.vjust = label.vjust, barwidth = barwidth, barheight = barheight, nbin = nbin, raster = raster, frame.colour = frame.colour, frame.linewidth = frame.linewidth, frame.linetype = frame.linetype, ticks = ticks, ticks.colour = ticks.colour, ticks.linewidth = ticks.linewidth, draw.ulim = draw.ulim, draw.llim = draw.llim, direction = direction, default.unit = default.unit, reverse = reverse, order = order, available_aes = available_aes, ..., name = "colorbar")
  • guide_colourbar(...)

    • list(title = title, title.position = title.position, title.theme = title.theme, title.hjust = title.hjust, title.vjust = title.vjust, label = label, label.position = label.position, label.theme = label.theme, label.hjust = label.hjust, label.vjust = label.vjust, barwidth = barwidth, barheight = barheight, nbin = nbin, raster = raster, frame.colour = frame.colour, frame.linewidth = frame.linewidth, frame.linetype = frame.linetype, ticks = ticks, ticks.colour = ticks.colour, ticks.linewidth = ticks.linewidth, draw.ulim = draw.ulim, draw.llim = draw.llim, direction = direction, default.unit = default.unit, reverse = reverse, order = order, available_aes = available_aes, ..., name = "colorbar")
  • guide_legend(...)

    • list(title = title, title.position = title.position, title.theme = title.theme, title.hjust = title.hjust, title.vjust = title.vjust, label = label, label.position = label.position, label.theme = label.theme, label.hjust = label.hjust, label.vjust = label.vjust, keywidth = keywidth, keyheight = keyheight, direction = direction, override.aes = rename_aes(override.aes), nrow = nrow, ncol = ncol, byrow = byrow, reverse = reverse, order = order, available_aes = c("any"), ..., name = "legend")
  • guides(...)

    • list(...)
  • labeller(...)

    • list(...)
  • labs(...)

    • list2(..., title = title, subtitle = subtitle, caption = caption, tag = tag)
  • lims(...)

    • list(...)
  • make_scale(...)

    • scale(...)
  • manual_scale(...)

    • discrete_scale(aesthetic, "manual", pal, ...)
  • map_data(...)

    • maps::map(map, region, exact = exact, plot = FALSE, fill = TRUE, ...)
  • message_wrap(...)

    • paste(..., collapse = "", sep = "")
  • modifyList(...)

    • (... is not used)
  • qplot(...)

    • enquos(x = x, y = y, ..., .ignore_empty = "all")
  • quickplot(...)

    • enquos(x = x, y = y, ..., .ignore_empty = "all")
  • scale_alpha(...)

    • continuous_scale("alpha", "alpha_c", rescale_pal(range), ...)
  • scale_alpha_continuous(...)

    • continuous_scale("alpha", "alpha_c", rescale_pal(range), ...)
  • scale_alpha_date(...)

    • datetime_scale("alpha", "date", palette = rescale_pal(range), ...)
  • scale_alpha_datetime(...)

    • datetime_scale("alpha", "time", palette = rescale_pal(range), ...)
  • scale_alpha_discrete(...)

    • scale_alpha_ordinal(...)
  • scale_alpha_identity(...)

    • continuous_scale("alpha", "identity", identity_pal(), ..., guide = guide, super = ScaleContinuousIdentity)
  • scale_alpha_manual(...)

    • manual_scale("alpha", values, ...)
  • scale_alpha_ordinal(...)

    • discrete_scale("alpha", "alpha_d", function(n) seq(range[1], range[2], length.out = n), ...)
  • scale_color_brewer(...)

    • discrete_scale(aesthetics, "brewer", brewer_pal(type, palette, direction), ...)
  • scale_color_continuous(...)

    • scale_colour_gradient(...)
    • scale_colour_viridis_c(...)
  • scale_color_discrete(...)

    • discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction), na.value = na.value, ...)
  • scale_color_distiller(...)

    • continuous_scale(aesthetics, "distiller", gradient_n_pal(brewer_pal(type, palette, direction)(7), values, space), na.value = na.value, guide = guide, ...)
  • scale_color_gradient(...)

    • continuous_scale(aesthetics, "gradient", seq_gradient_pal(low, high, space), na.value = na.value, guide = guide, ...)
  • scale_color_gradient2(...)

    • continuous_scale(aesthetics, "gradient2", div_gradient_pal(low, mid, high, space), na.value = na.value, guide = guide, ..., rescaler = mid_rescaler(mid = midpoint))
  • scale_color_gradientn(...)

    • continuous_scale(aesthetics, "gradientn", gradient_n_pal(colours, values, space), na.value = na.value, guide = guide, ...)
  • scale_color_grey(...)

    • discrete_scale(aesthetics, "grey", grey_pal(start, end), na.value = na.value, ...)
  • scale_color_hue(...)

    • discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction), na.value = na.value, ...)
  • scale_color_identity(...)

    • discrete_scale(aesthetics, "identity", identity_pal(), ..., guide = guide, super = ScaleDiscreteIdentity)
  • scale_color_manual(...)

    • manual_scale(aesthetics, values, ...)
  • scale_color_viridis_c(...)

    • continuous_scale(aesthetics, "viridis_c", gradient_n_pal(viridis_pal(alpha, begin, end, direction, option)(6), values, space), na.value = na.value, guide = guide, ...)
  • scale_color_viridis_d(...)

    • discrete_scale(aesthetics, "viridis_d", viridis_pal(alpha, begin, end, direction, option), ...)
  • scale_colour_brewer(...)

    • discrete_scale(aesthetics, "brewer", brewer_pal(type, palette, direction), ...)
  • scale_colour_continuous(...)

    • scale_colour_gradient(...)
    • scale_colour_viridis_c(...)
  • scale_colour_date(...)

    • datetime_scale("colour", "date", palette = seq_gradient_pal(low, high, space), na.value = na.value, guide = guide, ...)
  • scale_colour_datetime(...)

    • datetime_scale("colour", "time", palette = seq_gradient_pal(low, high, space), na.value = na.value, guide = guide, ...)
  • scale_colour_discrete(...)

    • discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction), na.value = na.value, ...)
  • scale_colour_distiller(...)

    • continuous_scale(aesthetics, "distiller", gradient_n_pal(brewer_pal(type, palette, direction)(7), values, space), na.value = na.value, guide = guide, ...)
  • scale_colour_gradient(...)

    • continuous_scale(aesthetics, "gradient", seq_gradient_pal(low, high, space), na.value = na.value, guide = guide, ...)
  • scale_colour_gradient2(...)

    • continuous_scale(aesthetics, "gradient2", div_gradient_pal(low, mid, high, space), na.value = na.value, guide = guide, ..., rescaler = mid_rescaler(mid = midpoint))
  • scale_colour_gradientn(...)

    • continuous_scale(aesthetics, "gradientn", gradient_n_pal(colours, values, space), na.value = na.value, guide = guide, ...)
  • scale_colour_grey(...)

    • discrete_scale(aesthetics, "grey", grey_pal(start, end), na.value = na.value, ...)
  • scale_colour_hue(...)

    • discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction), na.value = na.value, ...)
  • scale_colour_identity(...)

    • discrete_scale(aesthetics, "identity", identity_pal(), ..., guide = guide, super = ScaleDiscreteIdentity)
  • scale_colour_manual(...)

    • manual_scale(aesthetics, values, ...)
  • scale_colour_ordinal(...)

    • discrete_scale(aesthetics, "viridis_d", viridis_pal(alpha, begin, end, direction, option), ...)
  • scale_colour_viridis_c(...)

    • continuous_scale(aesthetics, "viridis_c", gradient_n_pal(viridis_pal(alpha, begin, end, direction, option)(6), values, space), na.value = na.value, guide = guide, ...)
  • scale_colour_viridis_d(...)

    • discrete_scale(aesthetics, "viridis_d", viridis_pal(alpha, begin, end, direction, option), ...)
  • scale_continuous_identity(...)

    • continuous_scale(aesthetics, "identity", identity_pal(), ..., guide = guide, super = ScaleContinuousIdentity)
  • scale_discrete_identity(...)

    • discrete_scale(aesthetics, "identity", identity_pal(), ..., guide = guide, super = ScaleDiscreteIdentity)
  • scale_discrete_manual(...)

    • manual_scale(aesthetics, values, ...)
  • scale_fill_brewer(...)

    • discrete_scale(aesthetics, "brewer", brewer_pal(type, palette, direction), ...)
  • scale_fill_continuous(...)

    • scale_fill_gradient(...)
    • scale_fill_viridis_c(...)
  • scale_fill_date(...)

    • datetime_scale("fill", "date", palette = seq_gradient_pal(low, high, space), na.value = na.value, guide = guide, ...)
  • scale_fill_datetime(...)

    • datetime_scale("fill", "time", palette = seq_gradient_pal(low, high, space), na.value = na.value, guide = guide, ...)
  • scale_fill_discrete(...)

    • discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction), na.value = na.value, ...)
  • scale_fill_distiller(...)

    • continuous_scale(aesthetics, "distiller", gradient_n_pal(brewer_pal(type, palette, direction)(7), values, space), na.value = na.value, guide = guide, ...)
  • scale_fill_gradient(...)

    • continuous_scale(aesthetics, "gradient", seq_gradient_pal(low, high, space), na.value = na.value, guide = guide, ...)
  • scale_fill_gradient2(...)

    • continuous_scale(aesthetics, "gradient2", div_gradient_pal(low, mid, high, space), na.value = na.value, guide = guide, ..., rescaler = mid_rescaler(mid = midpoint))
  • scale_fill_gradientn(...)

    • continuous_scale(aesthetics, "gradientn", gradient_n_pal(colours, values, space), na.value = na.value, guide = guide, ...)
  • scale_fill_grey(...)

    • discrete_scale(aesthetics, "grey", grey_pal(start, end), na.value = na.value, ...)
  • scale_fill_hue(...)

    • discrete_scale(aesthetics, "hue", hue_pal(h, c, l, h.start, direction), na.value = na.value, ...)
  • scale_fill_identity(...)

    • discrete_scale(aesthetics, "identity", identity_pal(), ..., guide = guide, super = ScaleDiscreteIdentity)
  • scale_fill_manual(...)

    • manual_scale(aesthetics, values, ...)
  • scale_fill_ordinal(...)

    • discrete_scale(aesthetics, "viridis_d", viridis_pal(alpha, begin, end, direction, option), ...)
  • scale_fill_viridis_c(...)

    • continuous_scale(aesthetics, "viridis_c", gradient_n_pal(viridis_pal(alpha, begin, end, direction, option)(6), values, space), na.value = na.value, guide = guide, ...)
  • scale_fill_viridis_d(...)

    • discrete_scale(aesthetics, "viridis_d", viridis_pal(alpha, begin, end, direction, option), ...)
  • scale_linetype(...)

    • discrete_scale("linetype", "linetype_d", linetype_pal(), na.value = na.value, ...)
  • scale_linetype_continuous(...)

    • (... is not used)
  • scale_linetype_discrete(...)

    • discrete_scale("linetype", "linetype_d", linetype_pal(), na.value = na.value, ...)
  • scale_linetype_identity(...)

    • discrete_scale("linetype", "identity", identity_pal(), ..., guide = guide, super = ScaleDiscreteIdentity)
  • scale_linetype_manual(...)

    • manual_scale("linetype", values, ...)
  • scale_shape(...)

    • discrete_scale("shape", "shape_d", shape_pal(solid), ...)
  • scale_shape_continuous(...)

    • (... is not used)
  • scale_shape_discrete(...)

    • discrete_scale("shape", "shape_d", shape_pal(solid), ...)
  • scale_shape_identity(...)

    • continuous_scale("shape", "identity", identity_pal(), ..., guide = guide, super = ScaleContinuousIdentity)
  • scale_shape_manual(...)

    • manual_scale("shape", values, ...)
  • scale_shape_ordinal(...)

    • scale_shape(...)
  • scale_size_area(...)

    • continuous_scale("size", "area", palette = abs_area(max_size), rescaler = rescale_max, ...)
  • scale_size_date(...)

    • datetime_scale("size", "date", palette = area_pal(range), ...)
  • scale_size_datetime(...)

    • datetime_scale("size", "time", palette = area_pal(range), ...)
  • scale_size_discrete(...)

    • scale_size_ordinal(...)
  • scale_size_identity(...)

    • continuous_scale("size", "identity", identity_pal(), ..., guide = guide, super = ScaleContinuousIdentity)
  • scale_size_manual(...)

    • manual_scale("size", values, ...)
  • scale_size_ordinal(...)

    • discrete_scale("size", "size_d", function(n) { area <- seq(range[1]^2, range[2]^2, length.out = n) sqrt(area) }, ...)
  • scale_x_discrete(...)

    • discrete_scale(c("x", "xmin", "xmax", "xend"), "position_d", identity, ..., expand = expand, guide = "none", position = position, super = ScaleDiscretePosition)
  • scale_x_log10(...)

    • scale_x_continuous(..., trans = log10_trans())
  • scale_x_reverse(...)

    • scale_x_continuous(..., trans = reverse_trans())
  • scale_x_sqrt(...)

    • scale_x_continuous(..., trans = sqrt_trans())
  • scale_y_discrete(...)

    • discrete_scale(c("y", "ymin", "ymax", "yend"), "position_d", identity, ..., expand = expand, guide = "none", position = position, super = ScaleDiscretePosition)
  • scale_y_log10(...)

    • scale_y_continuous(..., trans = log10_trans())
  • scale_y_reverse(...)

    • scale_y_continuous(..., trans = reverse_trans())
  • scale_y_sqrt(...)

    • scale_y_continuous(..., trans = sqrt_trans())
  • ScaleContinuous$print(...)

    • (... is not used)
  • ScaleDiscrete$get_breaks_minor(...)

    • (... is not used)
  • stat_bin(...)

    • list(binwidth = binwidth, bins = bins, center = center, boundary = boundary, breaks = breaks, closed = closed, pad = pad, na.rm = na.rm, ...)
  • stat_bin_2d(...)

    • list(bins = bins, binwidth = binwidth, drop = drop, na.rm = na.rm, ...)
  • stat_bin_hex(...)

    • list(bins = bins, binwidth = binwidth, na.rm = na.rm, ...)
  • stat_bin2d(...)

    • list(bins = bins, binwidth = binwidth, drop = drop, na.rm = na.rm, ...)
  • stat_binhex(...)

    • list(bins = bins, binwidth = binwidth, na.rm = na.rm, ...)
  • stat_boxplot(...)

    • list(na.rm = na.rm, coef = coef, ...)
  • stat_contour(...)

    • list(na.rm = na.rm, ...)
  • stat_count(...)

    • list(na.rm = na.rm, width = width, ...)
  • stat_density(...)

    • list(bw = bw, adjust = adjust, kernel = kernel, n = n, trim = trim, na.rm = na.rm, ...)
  • stat_density_2d(...)

    • list(na.rm = na.rm, contour = contour, n = n, h = h, ...)
  • stat_density2d(...)

    • list(na.rm = na.rm, contour = contour, n = n, h = h, ...)
  • stat_ecdf(...)

    • list(n = n, pad = pad, na.rm = na.rm, ...)
  • stat_ellipse(...)

    • list(type = type, level = level, segments = segments, na.rm = na.rm, ...)
  • stat_function(...)

    • list(fun = fun, n = n, args = args, na.rm = na.rm, xlim = xlim, ...)
  • stat_identity(...)

    • list(na.rm = FALSE, ...)
  • stat_qq(...)

    • list(distribution = distribution, dparams = dparams, na.rm = na.rm, ...)
  • stat_qq_line(...)

    • list(distribution = distribution, dparams = dparams, na.rm = na.rm, line.p = line.p, fullrange = fullrange, ...)
  • stat_quantile(...)

    • list(quantiles = quantiles, formula = formula, method = method, method.args = method.args, na.rm = na.rm, ...)
  • stat_sf(...)

    • list(na.rm = na.rm, legend = if (is.character(show.legend)) show.legend else "polygon", ...)
  • stat_sf_coordinates(...)

    • list(na.rm = na.rm, fun.geometry = fun.geometry, ...)
  • stat_smooth(...)

    • list(method = method, formula = formula, se = se, n = n, fullrange = fullrange, level = level, na.rm = na.rm, method.args = method.args, span = span, ...)
  • stat_spoke(...)

    • geom_spoke(...)
  • stat_sum(...)

    • list(na.rm = na.rm, ...)
  • stat_summary(...)

    • list(fun.data = fun.data, fun.y = fun.y, fun.ymax = fun.ymax, fun.ymin = fun.ymin, fun.args = fun.args, na.rm = na.rm, ...)
  • stat_summary_2d(...)

    • list(bins = bins, binwidth = binwidth, drop = drop, fun = fun, fun.args = fun.args, na.rm = na.rm, ...)
  • stat_summary_bin(...)

    • list(fun.data = fun.data, fun.y = fun.y, fun.ymax = fun.ymax, fun.ymin = fun.ymin, fun.args = fun.args, bins = bins, binwidth = binwidth, breaks = breaks, na.rm = na.rm, ...)
  • stat_summary_hex(...)

    • list(bins = bins, binwidth = binwidth, drop = drop, fun = fun, fun.args = fun.args, na.rm = na.rm, ...)
  • stat_summary2d(...)

    • stat_summary_2d(...)
  • stat_unique(...)

    • list(na.rm = na.rm, ...)
  • stat_ydensity(...)

    • list(bw = bw, adjust = adjust, kernel = kernel, trim = trim, scale = scale, na.rm = na.rm, ...)
  • Stat$compute_panel(...)

    • self$compute_group(data = group, scales = scales, ...)
  • summarise_by_x(...)

    • dapply(data, c("group", "x"), summary, ...)
  • tapply_df(...)

    • lapply(grps, fun, ...)
  • theme(...)

    • find_args(..., complete = NULL, validate = NULL)
  • theme_replace(...)

    • theme(...)
  • theme_update(...)

    • theme(...)
  • transform_position(...)

    • lapply(df[scales == "x"], trans_x, ...)
    • lapply(df[scales == "y"], trans_y, ...)
  • vars(...)

    • quos(...)
  • warning_wrap(...)

    • paste(..., collapse = "", sep = "")
  • xlim(...)

    • c(...)
  • ylim(...)

    • c(...)

Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment