Skip to content

Commit 981509e

Browse files
committed
check_polar_guide() is validator
1 parent a2c6cf1 commit 981509e

File tree

1 file changed

+2
-2
lines changed

1 file changed

+2
-2
lines changed

R/coord-radial.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -180,7 +180,7 @@ CoordRadial <- ggproto("CoordRadial", Coord,
180180
# Validate appropriateness of guides
181181
drop_guides <- character(0)
182182
for (type in aesthetics) {
183-
drop_guides <- check_polar_guide(drop_guides, guides, type)
183+
drop_guides <- validate_polar_guide(drop_guides, guides, type)
184184
}
185185

186186
guide_params <- guides$get_params(aesthetics)
@@ -648,7 +648,7 @@ theta_grid <- function(theta, element, inner_radius = c(0, 0.4),
648648
)
649649
}
650650

651-
check_polar_guide <- function(drop_list, guides, type = "theta") {
651+
validate_polar_guide <- function(drop_list, guides, type = "theta") {
652652
guide <- guides$get_guide(type)
653653
primary <- gsub("\\.sec$", "", type)
654654
if (inherits(guide, "GuideNone") || primary %in% guide$available_aes) {

0 commit comments

Comments
 (0)