Skip to content

Commit

Permalink
check_polar_guide() is validator
Browse files Browse the repository at this point in the history
  • Loading branch information
teunbrand committed Sep 3, 2024
1 parent a2c6cf1 commit 981509e
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/coord-radial.R
Original file line number Diff line number Diff line change
Expand Up @@ -180,7 +180,7 @@ CoordRadial <- ggproto("CoordRadial", Coord,
# Validate appropriateness of guides
drop_guides <- character(0)
for (type in aesthetics) {
drop_guides <- check_polar_guide(drop_guides, guides, type)
drop_guides <- validate_polar_guide(drop_guides, guides, type)
}

guide_params <- guides$get_params(aesthetics)
Expand Down Expand Up @@ -648,7 +648,7 @@ theta_grid <- function(theta, element, inner_radius = c(0, 0.4),
)
}

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

0 comments on commit 981509e

Please sign in to comment.