Skip to content

Commit 81b66e6

Browse files
committed
Merge branch 'markpayneatwork-master'
2 parents 2105a02 + 1712dc9 commit 81b66e6

File tree

3 files changed

+28
-5
lines changed

3 files changed

+28
-5
lines changed

NEWS.md

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -351,6 +351,9 @@ version of ggplot.
351351
making it easier to plot multiple grobs with the same name (e.g. grobs of
352352
ggplot2 graphics) in the same plot (#1256).
353353

354+
* `borders()` now accepts xlim and ylim arguments for specifying the geographical
355+
region of interest (@markpayneatwork, #1392).
356+
354357
* `coord_cartesian()` applies the same expansion factor to limits as for scales.
355358
You can suppress with `expand = FALSE` (#1207).
356359

R/fortify-map.r

Lines changed: 13 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -74,6 +74,8 @@ map_data <- function(map, region = ".", exact = FALSE, ...) {
7474
#' @param regions map region
7575
#' @param fill fill colour
7676
#' @param colour border colour
77+
#' @param xlim,ylim latitudinal and logitudinal range for extracting map
78+
#' polygons, see \code{\link[maps]{map}} for details.
7779
#' @param ... other arguments passed onto \code{\link{geom_polygon}}
7880
#' @export
7981
#' @examples
@@ -91,11 +93,19 @@ map_data <- function(map, region = ".", exact = FALSE, ...) {
9193
#' ggplot(capitals, aes(long, lat)) +
9294
#' borders("state") +
9395
#' geom_point(aes(size = pop)) +
94-
#' scale_size_area()
96+
#' scale_size_area() +
97+
#' coord_quickmap()
9598
#'
99+
#' # Same map, with some world context
100+
#' ggplot(capitals, aes(long, lat)) +
101+
#' borders("world", xlim = c(-130, -60), ylim = c(20, 50)) +
102+
#' geom_point(aes(size = pop)) +
103+
#' scale_size_area() +
104+
#' coord_quickmap()
96105
#' }
97-
borders <- function(database = "world", regions = ".", fill = NA, colour = "grey50", ...) {
98-
df <- map_data(database, regions)
106+
borders <- function(database = "world", regions = ".", fill = NA,
107+
colour = "grey50", xlim = NULL, ylim = NULL, ...) {
108+
df <- map_data(database, regions, xlim = xlim, ylim = ylim)
99109
geom_polygon(aes_(~long, ~lat, group = ~group), data = df,
100110
fill = fill, colour = colour, ..., inherit.aes = FALSE)
101111
}

man/borders.Rd

Lines changed: 12 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)