Skip to content

Commit 8533322

Browse files
committed
check_labeller() performs an update
1 parent c2487de commit 8533322

File tree

3 files changed

+3
-3
lines changed

3 files changed

+3
-3
lines changed

R/facet-grid-.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -177,7 +177,7 @@ facet_grid <- function(rows = NULL, cols = NULL, scales = "fixed",
177177
facets_list <- grid_as_facets_list(rows, cols)
178178

179179
# Check for deprecated labellers
180-
labeller <- check_labeller(labeller)
180+
labeller <- update_labeller(labeller)
181181

182182
ggproto(NULL, FacetGrid,
183183
shrink = shrink,

R/facet-wrap.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -174,7 +174,7 @@ facet_wrap <- function(facets, nrow = NULL, ncol = NULL, scales = "fixed",
174174
)
175175

176176
# Check for deprecated labellers
177-
labeller <- check_labeller(labeller)
177+
labeller <- update_labeller(labeller)
178178

179179
# Flatten all facets dimensions into a single one
180180
facets <- wrap_as_facets_list(facets)

R/labeller.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -590,7 +590,7 @@ assemble_strips <- function(grobs, theme, horizontal = TRUE, clip) {
590590
}
591591

592592
# Check for old school labeller
593-
check_labeller <- function(labeller) {
593+
update_labeller <- function(labeller) {
594594
labeller <- match.fun(labeller)
595595
is_deprecated <- all(c("variable", "value") %in% names(formals(labeller)))
596596

0 commit comments

Comments
 (0)