R/utils-ggplot.R

Defines functions reverse_continuous_axis default_expansion ggremove_margin gguse_data compact_facets maybe_guide_box is_palette_unset ggadd_default snake_class `%|w|%` allow_lambda ggfun

#' @importFrom ggplot2 .pt
ggfun <- function(fn, mode = "any") from_namespace("ggplot2", fn, mode = mode)

S3_ggplot <- S7::new_S3_class("ggplot")
S3_waiver <- S7::new_S3_class("waiver")

allow_lambda <- function(x) {
    if (rlang::is_formula(x)) rlang::as_function(x) else x
}

#' @importFrom ggplot2 is_waiver
`%|w|%` <- function(x, y) if (is_waiver(x)) y else x

snake_class <- function(x) ggfun("snake_class")(x)

ggadd_default <- function(plot, mapping = NULL, theme = NULL) {
    if (!is.null(mapping)) {
        plot <- plot + mapping + plot$mapping
    }
    if (!is.null(theme)) plot$theme <- theme + plot$theme
    plot
}

is_palette_unset <- function(type, aes) {
    type <- match.arg(type, c("discrete", "continuous", "binned"))
    aes <- match.arg(aes, c("fill", "colour"))
    is.null(getOption(sprintf("ggplot2.%s.%s", type, aes)))
}

# A guide-box should be a `zeroGrob()` or a `gtable` object
#' @importFrom gtable is.gtable
maybe_guide_box <- function(x) inherits(x, "zeroGrob") || is.gtable(x)

compact_facets <- function(facets) ggfun("compact_facets")(facets)

######################################################
gguse_data <- function(plot, data) {
    # ggplot use waiver() to indicate no data
    plot["data"] <- list(data %||% waiver())
    plot
}

ggremove_margin <- function(plot, direction) {
    if (!is.null(direction)) {
        plot <- plot + switch_direction(
            direction,
            theme(plot.margin = margin(t = 0, r = NA, b = 0, l = NA)),
            theme(plot.margin = margin(t = NA, r = 0, b = NA, l = 0))
        )
    }
    plot
}

######################################################
default_expansion <- function(x = NULL, y = NULL) {
    structure(list(x = x, y = y), class = c("ggalign_default_expansion"))
}

#' @importFrom ggplot2 update_ggplot ggproto ggproto_parent
S7::method(
    update_ggplot,
    list(S7::new_S3_class("ggalign_default_expansion"), ggplot2::class_ggplot)
) <-
    function(object, plot, objectname, ...) {
        if (is.null(.subset2(object, "x")) && is.null(.subset2(object, "y"))) {
            return(plot)
        }
        ParentFacet <- plot$facet
        plot$facet <- ggproto(
            NULL,
            ParentFacet,
            init_scales = function(self, layout, x_scale = NULL, y_scale = NULL,
                                   params) {
                if (!is.null(x_scale) && !is.null(.subset2(object, "x"))) {
                    x_scale$expand <- x_scale$expand %|w|% .subset2(object, "x")
                }
                if (!is.null(y_scale) && !is.null(.subset2(object, "y"))) {
                    y_scale$expand <- y_scale$expand %|w|% .subset2(object, "y")
                }
                ggproto_parent(ParentFacet, self)$init_scales(
                    layout = layout,
                    x_scale = x_scale,
                    y_scale = y_scale,
                    params = params
                )
            }
        )
        plot
    }

######################################################
reverse_continuous_axis <- function(plot, axis) {
    if (plot$scales$has_scale(axis)) {
        # modify scale in place
        scale <- plot$scales$get_scales(axis)
        if (!scale$is_discrete()) {
            if (identical(scale$trans$name, "identity")) {
                scale$trans <- scales::as.transform("reverse")
            } else if (identical(scale$trans$name, "reverse")) {
                scale$trans <- scales::as.transform("identity")
            }
        }
    } else {
        plot <- plot +
            switch(axis,
                x = ggplot2::scale_x_reverse(),
                y = ggplot2::scale_y_reverse()
            )
    }
    plot
}

Try the ggalign package in your browser

Any scripts or data that you put into this service are public.

ggalign documentation built on Nov. 5, 2025, 7:16 p.m.