Skip to content

Commit e332c13

Browse files
committed
Use aes_q in borders to eliminate check warning
1 parent ce2c873 commit e332c13

File tree

2 files changed

+3
-3
lines changed

2 files changed

+3
-3
lines changed

R/fortify-map.r

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -88,11 +88,11 @@ map_data <- function(map, region = ".", exact = FALSE, ...) {
8888
#' ggplot(capitals, aes(long, lat)) +
8989
#' borders("state") +
9090
#' geom_point(aes(size = pop)) +
91-
#' scale_area()
91+
#' scale_size_area()
9292
#'
9393
#' }
9494
borders <- function(database = "world", regions = ".", fill = NA, colour = "grey50", ...) {
9595
df <- map_data(database, regions)
96-
geom_polygon(aes(long, lat, group = group), data = df,
96+
geom_polygon(aes_q(quote(long), quote(lat), group = quote(group)), data = df,
9797
fill = fill, colour = colour, ...)
9898
}

man/borders.Rd

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -36,7 +36,7 @@ capitals <- subset(us.cities, capital == 2)
3636
ggplot(capitals, aes(long, lat)) +
3737
borders("state") +
3838
geom_point(aes(size = pop)) +
39-
scale_area()
39+
scale_size_area()
4040

4141
}
4242
}

0 commit comments

Comments
 (0)