Skip to content

Commit

Permalink
Update ggplot2 version
Browse files Browse the repository at this point in the history
  • Loading branch information
yutannihilation committed Sep 3, 2023
1 parent f97c57a commit da74344
Showing 1 changed file with 8 additions and 8 deletions.
16 changes: 8 additions & 8 deletions R/fortify-spatial.R
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,7 @@ NULL
#' @export
#' @method fortify SpatialPolygonsDataFrame
fortify.SpatialPolygonsDataFrame <- function(model, data, region = NULL, ...) {
deprecate_warn0("3.4.3",
deprecate_warn0("3.5.0",
I("`fortify(<SpatialPolygonsDataFrame>)`"),
details = "Please migrate to sf."
)
Expand All @@ -30,7 +30,7 @@ fortify.SpatialPolygonsDataFrame <- function(model, data, region = NULL, ...) {
coords <- vec_rbind0(!!!coords)
cli::cli_inform("Regions defined for each Polygons")
} else {
lifecycle::deprecate_stop("3.4.3",
lifecycle::deprecate_stop("3.5.0",
I("`fortify(<SpatialPolygonsDataFrame>, region = ...)` is defunct'"),
details = "Please migrate to sf."
)
Expand All @@ -42,7 +42,7 @@ fortify.SpatialPolygonsDataFrame <- function(model, data, region = NULL, ...) {
#' @export
#' @method fortify SpatialPolygons
fortify.SpatialPolygons <- function(model, data, ...) {
deprecate_warn0("3.4.3",
deprecate_warn0("3.5.0",
I("`fortify(<SpatialPolygons>)`"),
details = "Please migrate to sf."
)
Expand All @@ -58,7 +58,7 @@ fortify.SpatialPolygons <- function(model, data, ...) {
#' @export
#' @method fortify Polygons
fortify.Polygons <- function(model, data, ...) {
deprecate_warn0("3.4.3",
deprecate_warn0("3.5.0",
I("`fortify(<Polygons>)`"),
details = "Please migrate to sf."
)
Expand All @@ -82,7 +82,7 @@ fortify.Polygons <- function(model, data, ...) {
#' @export
#' @method fortify Polygon
fortify.Polygon <- function(model, data, ...) {
deprecate_warn0("3.4.3",
deprecate_warn0("3.5.0",
I("`fortify(<Polygon>)`"),
details = "Please migrate to sf."
)
Expand All @@ -98,7 +98,7 @@ fortify.Polygon <- function(model, data, ...) {
#' @export
#' @method fortify SpatialLinesDataFrame
fortify.SpatialLinesDataFrame <- function(model, data, ...) {
deprecate_warn0("3.4.3",
deprecate_warn0("3.5.0",
I("`fortify(<SpatialLinesDataFrame>)`"),
details = "Please migrate to sf."
)
Expand All @@ -111,7 +111,7 @@ fortify.SpatialLinesDataFrame <- function(model, data, ...) {
#' @export
#' @method fortify Lines
fortify.Lines <- function(model, data, ...) {
deprecate_warn0("3.4.3",
deprecate_warn0("3.5.0",
I("`fortify(<Lines>)`"),
details = "Please migrate to sf."
)
Expand All @@ -135,7 +135,7 @@ fortify.Lines <- function(model, data, ...) {
#' @export
#' @method fortify Line
fortify.Line <- function(model, data, ...) {
deprecate_warn0("3.4.3",
deprecate_warn0("3.5.0",
I("`fortify(<Line>)`"),
details = "Please migrate to sf."
)
Expand Down

0 comments on commit da74344

Please sign in to comment.