Skip to content

Commit ff944e4

Browse files
author
markpayneatwork
committed
Added xlim and ylim arguments to borders()
1 parent ef33dc7 commit ff944e4

File tree

1 file changed

+11
-3
lines changed

1 file changed

+11
-3
lines changed

R/fortify-map.r

Lines changed: 11 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -74,6 +74,7 @@ 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" map xlim and ylim,, see \code{\link[maps]{map}} for details
7778
#' @param ... other arguments passed onto \code{\link{geom_polygon}}
7879
#' @export
7980
#' @examples
@@ -92,10 +93,17 @@ map_data <- function(map, region = ".", exact = FALSE, ...) {
9293
#' borders("state") +
9394
#' geom_point(aes(size = pop)) +
9495
#' scale_size_area()
95-
#'
96+
#'
97+
#' #Same map, with geographical context
98+
#' data(us.cities)
99+
#' capitals <- subset(us.cities, capital == 2)
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()+coord_quickmap(xlim=c(-130,-60),ylim=c(20,50))
96104
#' }
97-
borders <- function(database = "world", regions = ".", fill = NA, colour = "grey50", ...) {
98-
df <- map_data(database, regions)
105+
borders <- function(database = "world", regions = ".", fill = NA, colour = "grey50", xlim=NULL,ylim=NULL,...) {
106+
df <- map_data(database, regions,xlim=xlim,ylim=ylim)
99107
geom_polygon(aes_(~long, ~lat, group = ~group), data = df,
100108
fill = fill, colour = colour, ..., inherit.aes = FALSE)
101109
}

0 commit comments

Comments
 (0)