Skip to content

Commit b3a3f83

Browse files
committed
remove outdated duplicate
1 parent ce40d88 commit b3a3f83

File tree

1 file changed

+0
-20
lines changed

1 file changed

+0
-20
lines changed

R/theme-elements.R

Lines changed: 0 additions & 20 deletions
Original file line numberDiff line numberDiff line change
@@ -321,26 +321,6 @@ element_geom <- S7::new_class(
321321
fill = NULL, colour = NULL
322322
)
323323

324-
#' @export
325-
#' @param type For testing elements: the type of element to expect. One of
326-
#' `"blank"`, `"rect"`, `"line"`, `"text"`, `"polygon"`, `"point"` or `"geom"`.
327-
#' @rdname is_tests
328-
is_theme_element <- function(x, type = "any") {
329-
switch(
330-
type %||% "any",
331-
any = inherits(x, "element"),
332-
rect = inherits(x, "element_rect"),
333-
line = inherits(x, "element_line"),
334-
text = inherits(x, "element_text"),
335-
polygon = inherits(x, "element_polygon"),
336-
point = inherits(x, "element_point"),
337-
geom = inherits(x, "element_geom"),
338-
blank = inherits(x, "element_blank"),
339-
# We don't consider elements from extensions
340-
FALSE
341-
)
342-
}
343-
344324
#' @export
345325
print.element <- function(x, ...) utils::str(x)
346326

0 commit comments

Comments
 (0)