Skip to content

Commit

Permalink
remove shape as non-missing aes (#5546)
Browse files Browse the repository at this point in the history
  • Loading branch information
teunbrand authored Dec 6, 2023
1 parent b38caa3 commit 41587fc
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/geom-segment.R
Original file line number Diff line number Diff line change
Expand Up @@ -103,15 +103,15 @@ geom_segment <- function(mapping = NULL, data = NULL,
#' @export
GeomSegment <- ggproto("GeomSegment", Geom,
required_aes = c("x", "y", "xend|yend"),
non_missing_aes = c("linetype", "linewidth", "shape"),
non_missing_aes = c("linetype", "linewidth"),
default_aes = aes(colour = "black", linewidth = 0.5, linetype = 1, alpha = NA),
draw_panel = function(self, data, panel_params, coord, arrow = NULL, arrow.fill = NULL,
lineend = "butt", linejoin = "round", na.rm = FALSE) {
data$xend <- data$xend %||% data$x
data$yend <- data$yend %||% data$y
data <- check_linewidth(data, snake_class(self))
data <- remove_missing(data, na.rm = na.rm,
c("x", "y", "xend", "yend", "linetype", "linewidth", "shape"),
c("x", "y", "xend", "yend", "linetype", "linewidth"),
name = "geom_segment"
)

Expand Down

0 comments on commit 41587fc

Please sign in to comment.