Skip to content

Commit d0f13bf

Browse files
committed
deprecate borders()
1 parent 00ce5ec commit d0f13bf

File tree

1 file changed

+8
-0
lines changed

1 file changed

+8
-0
lines changed

R/annotation-borders.R

Lines changed: 8 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -51,3 +51,11 @@ annotation_borders <- function(database = "world", regions = ".", fill = NA,
5151
geom_polygon(aes(.data$long, .data$lat, group = .data$group), data = df,
5252
fill = fill, colour = colour, ..., inherit.aes = FALSE)
5353
}
54+
55+
#' @export
56+
#' @rdname annotation_borders
57+
#' @usage borders(...) # Deprecated
58+
borders <- function(...) {
59+
deprecate_soft0("4.0.0", "borders()", "annotation_borders()")
60+
annotation_borders(...)
61+
}

0 commit comments

Comments
 (0)