Skip to content

Commit ec9e909

Browse files
committed
resolve merge conflict
Merge branch 'main' into rc/3.5.2 # Conflicts: # DESCRIPTION # NAMESPACE # R/aes.R # R/bin.R # R/coord-.R # R/coord-cartesian-.R # R/facet-.R # R/fortify.R # R/geom-.R # R/geom-defaults.R # R/geom-label.R # R/ggproto.R # R/guide-.R # R/guide-axis.R # R/guides-.R # R/layer.R # R/margins.R # R/plot-build.R # R/plot-construction.R # R/plot.R # R/position-.R # R/save.R # R/scale-.R # R/scale-colour.R # R/stat-.R # R/stat-ellipse.R # R/theme-current.R # R/theme-elements.R # R/theme.R # README.Rmd # cran-comments.md # man/coord_polar.Rd # man/element.Rd # man/get_geom_defaults.Rd # man/is_tests.Rd # man/stat_connect.Rd # man/stat_ellipse.Rd # revdep/README.md # revdep/cran.md # revdep/failures.md # revdep/problems.md # tests/testthat/_snaps/utilities-checks.md # tests/testthat/test-utilities-checks.R
2 parents 2ff77b1 + 5b0ea0b commit ec9e909

File tree

2 files changed

+22
-22
lines changed

2 files changed

+22
-22
lines changed

R/theme-elements.R

+14-14
Original file line numberDiff line numberDiff line change
@@ -173,20 +173,6 @@ element_text <- function(family = NULL, face = NULL, colour = NULL,
173173
)
174174
}
175175

176-
#' @export
177-
#' @rdname element
178-
is_theme_element <- function(x, type = "any") {
179-
switch(
180-
type %||% "any",
181-
any = inherits(x, "element"),
182-
rect = inherits(x, "element_rect"),
183-
line = inherits(x, "element_line"),
184-
text = inherits(x, "element_text"),
185-
blank = inherits(x, "element_blank"),
186-
FALSE
187-
)
188-
}
189-
190176
element_polygon <- function(fill = NULL, colour = NULL, linewidth = NULL,
191177
linetype = NULL, color = NULL,
192178
inherit.blank = FALSE) {
@@ -260,6 +246,20 @@ element_geom <- function(
260246
fill = NULL, colour = NULL
261247
)
262248

249+
#' @export
250+
#' @rdname element
251+
is_theme_element <- function(x, type = "any") {
252+
switch(
253+
type %||% "any",
254+
any = inherits(x, "element"),
255+
rect = inherits(x, "element_rect"),
256+
line = inherits(x, "element_line"),
257+
text = inherits(x, "element_text"),
258+
blank = inherits(x, "element_blank"),
259+
FALSE
260+
)
261+
}
262+
263263
#' @export
264264
print.element <- function(x, ...) utils::str(x)
265265

man/element.Rd

+8-8
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)