@@ -108,7 +108,7 @@ CoordSf <- ggproto("CoordSf", CoordCartesian,
108108 x_breaks <- graticule $ degree [graticule $ type == " E" ]
109109 if (is.null(scale_x $ labels )) {
110110 x_labels <- rep(NA , length(x_breaks ))
111- } else if (is.waive (scale_x $ labels )) {
111+ } else if (is.waiver (scale_x $ labels )) {
112112 x_labels <- graticule $ degree_label [graticule $ type == " E" ]
113113 needs_autoparsing [graticule $ type == " E" ] <- TRUE
114114 } else {
@@ -133,7 +133,7 @@ CoordSf <- ggproto("CoordSf", CoordCartesian,
133133 y_breaks <- graticule $ degree [graticule $ type == " N" ]
134134 if (is.null(scale_y $ labels )) {
135135 y_labels <- rep(NA , length(y_breaks ))
136- } else if (is.waive (scale_y $ labels )) {
136+ } else if (is.waiver (scale_y $ labels )) {
137137 y_labels <- graticule $ degree_label [graticule $ type == " N" ]
138138 needs_autoparsing [graticule $ type == " N" ] <- TRUE
139139 } else {
@@ -534,7 +534,7 @@ coord_sf <- function(xlim = NULL, ylim = NULL, expand = TRUE,
534534 label_axes = waiver(), lims_method = " cross" ,
535535 ndiscr = 100 , default = FALSE , clip = " on" ) {
536536
537- if (is.waive (label_graticule ) && is.waive (label_axes )) {
537+ if (is.waiver (label_graticule ) && is.waiver (label_axes )) {
538538 # if both `label_graticule` and `label_axes` are set to waive then we
539539 # use the default of labels on the left and at the bottom
540540 label_graticule <- " "
@@ -620,13 +620,13 @@ sf_breaks <- function(scale_x, scale_y, bbox, crs) {
620620 bbox [is.na(bbox )] <- c(- 180 , - 90 , 180 , 90 )[is.na(bbox )]
621621 }
622622
623- if (! (is.waive (scale_x $ breaks ) && is.null(scale_x $ n.breaks ))) {
623+ if (! (is.waiver (scale_x $ breaks ) && is.null(scale_x $ n.breaks ))) {
624624 x_breaks <- scale_x $ get_breaks(limits = bbox [c(1 , 3 )])
625625 finite <- is.finite(x_breaks )
626626 x_breaks <- if (any(finite )) x_breaks [finite ] else NULL
627627 }
628628
629- if (! (is.waive (scale_y $ breaks ) && is.null(scale_y $ n.breaks ))) {
629+ if (! (is.waiver (scale_y $ breaks ) && is.null(scale_y $ n.breaks ))) {
630630 y_breaks <- scale_y $ get_breaks(limits = bbox [c(2 , 4 )])
631631 finite <- is.finite(y_breaks )
632632 y_breaks <- if (any(finite )) y_breaks [finite ] else NULL
0 commit comments