Skip to content

Commit 4ed6abe

Browse files
committed
Add back deleted functions
1 parent be1b49f commit 4ed6abe

File tree

2 files changed

+2
-0
lines changed

2 files changed

+2
-0
lines changed

R/layer.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -465,6 +465,7 @@ Layer <- ggproto("Layer", NULL,
465465
#' @export
466466
#' @rdname is_tests
467467
is_layer <- function(x) inherits(x, "Layer")
468+
is.layer <- function(x) lifecycle::deprecate_stop("3.5.2", "is.layer()", "is_layer()")
468469

469470
check_subclass <- function(x, subclass,
470471
argname = to_lower_ascii(subclass),

R/margins.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -14,6 +14,7 @@ margin <- function(t = 0, r = 0, b = 0, l = 0, unit = "pt") {
1414
is_margin <- function(x) {
1515
inherits(x, "margin")
1616
}
17+
is.margin <- function(x) lifecycle::deprecate_stop("3.5.2", "is.margin()", "is_margin()")
1718

1819
#' Create a text grob with the proper location and margins
1920
#'

0 commit comments

Comments
 (0)