diff --git a/R/coord-radial.R b/R/coord-radial.R index bc933ea1d7..32003a39bb 100644 --- a/R/coord-radial.R +++ b/R/coord-radial.R @@ -4,6 +4,7 @@ #' @param end Position from 12 o'clock in radians where plot ends, to allow #' for partial polar coordinates. The default, `NULL`, is set to #' `start + 2 * pi`. +#' @param thetalim,rlim Limits for the theta and r axes. #' @param expand If `TRUE`, the default, adds a small expansion factor to #' the limits to prevent overlap between data and axes. If `FALSE`, limits #' are taken directly from the scale. @@ -40,9 +41,20 @@ #' ggplot(mtcars, aes(disp, mpg)) + #' geom_point() + #' coord_radial(start = -0.4 * pi, end = 0.4 * pi, inner.radius = 0.3) +#' +#' # Similar with coord_cartesian(), you can set limits. +#' ggplot(mtcars, aes(disp, mpg)) + +#' geom_point() + +#' coord_radial( +#' start = -0.4 * pi, +#' end = 0.4 * pi, inner.radius = 0.3, +#' thetalim = c(200, 300), +#' rlim = c(15, 30), +#' clip = "on" +#' ) coord_radial <- function(theta = "x", start = 0, end = NULL, - expand = TRUE, + thetalim = NULL, rlim = NULL, expand = TRUE, direction = deprecated(), clip = "off", r.axis.inside = NULL, @@ -96,6 +108,7 @@ coord_radial <- function(theta = "x", inner.radius <- switch(reverse, thetar = , r = rev, identity)(inner.radius) ggproto(NULL, CoordRadial, + limits = list(theta = thetalim, r = rlim), theta = theta, r = r, arc = arc, @@ -147,10 +160,20 @@ CoordRadial <- ggproto("CoordRadial", Coord, }, setup_panel_params = function(self, scale_x, scale_y, params = list()) { - + if (self$theta == "x") { + xlimits <- self$limits$theta + ylimits <- self$limits$r + } else { + xlimits <- self$limits$r + ylimits <- self$limits$theta + } params <- c( - view_scales_polar(scale_x, self$theta, expand = params$expand[c(4, 2)]), - view_scales_polar(scale_y, self$theta, expand = params$expand[c(3, 1)]), + view_scales_polar(scale_x, self$theta, xlimits, + expand = params$expand[c(4, 2)] + ), + view_scales_polar(scale_y, self$theta, ylimits, + expand = params$expand[c(3, 1)] + ), list(bbox = polar_bbox(self$arc, inner_radius = self$inner_radius), arc = self$arc, inner_radius = self$inner_radius) ) @@ -454,7 +477,8 @@ CoordRadial <- ggproto("CoordRadial", Coord, } ) -view_scales_polar <- function(scale, theta = "x", expand = TRUE) { +view_scales_polar <- function(scale, theta = "x", coord_limits = NULL, + expand = TRUE) { aesthetic <- scale$aesthetics[1] is_theta <- theta == aesthetic @@ -462,7 +486,10 @@ view_scales_polar <- function(scale, theta = "x", expand = TRUE) { expansion <- default_expansion(scale, expand = expand) limits <- scale$get_limits() - continuous_range <- expand_limits_scale(scale, expansion, limits) + continuous_range <- expand_limits_scale( + scale, expansion, limits, + coord_limits + ) primary <- view_scale_primary(scale, limits, continuous_range) view_scales <- list( diff --git a/man/coord_polar.Rd b/man/coord_polar.Rd index 35d9083bfd..23bbcb97ea 100644 --- a/man/coord_polar.Rd +++ b/man/coord_polar.Rd @@ -11,6 +11,8 @@ coord_radial( theta = "x", start = 0, end = NULL, + thetalim = NULL, + rlim = NULL, expand = TRUE, direction = deprecated(), clip = "off", @@ -38,6 +40,8 @@ means no. For details, please see \code{\link[=coord_cartesian]{coord_cartesian( for partial polar coordinates. The default, \code{NULL}, is set to \code{start + 2 * pi}.} +\item{thetalim, rlim}{Limits for the theta and r axes.} + \item{expand}{If \code{TRUE}, the default, adds a small expansion factor to the limits to prevent overlap between data and axes. If \code{FALSE}, limits are taken directly from the scale.} @@ -131,6 +135,17 @@ doh + geom_bar(width = 0.9, position = "fill") + coord_polar(theta = "y") ggplot(mtcars, aes(disp, mpg)) + geom_point() + coord_radial(start = -0.4 * pi, end = 0.4 * pi, inner.radius = 0.3) + +# Similar with coord_cartesian(), you can set limits. +ggplot(mtcars, aes(disp, mpg)) + + geom_point() + + coord_radial( + start = -0.4 * pi, + end = 0.4 * pi, inner.radius = 0.3, + thetalim = c(200, 300), + rlim = c(15, 30), + clip = "on" + ) } \seealso{ The \href{https://ggplot2-book.org/coord#polar-coordinates-with-coord_polar}{polar coordinates section} of the online ggplot2 book.