Skip to content

Commit 41587fc

Browse files
authored
remove shape as non-missing aes (#5546)
1 parent b38caa3 commit 41587fc

File tree

1 file changed

+2
-2
lines changed

1 file changed

+2
-2
lines changed

R/geom-segment.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -103,15 +103,15 @@ geom_segment <- function(mapping = NULL, data = NULL,
103103
#' @export
104104
GeomSegment <- ggproto("GeomSegment", Geom,
105105
required_aes = c("x", "y", "xend|yend"),
106-
non_missing_aes = c("linetype", "linewidth", "shape"),
106+
non_missing_aes = c("linetype", "linewidth"),
107107
default_aes = aes(colour = "black", linewidth = 0.5, linetype = 1, alpha = NA),
108108
draw_panel = function(self, data, panel_params, coord, arrow = NULL, arrow.fill = NULL,
109109
lineend = "butt", linejoin = "round", na.rm = FALSE) {
110110
data$xend <- data$xend %||% data$x
111111
data$yend <- data$yend %||% data$y
112112
data <- check_linewidth(data, snake_class(self))
113113
data <- remove_missing(data, na.rm = na.rm,
114-
c("x", "y", "xend", "yend", "linetype", "linewidth", "shape"),
114+
c("x", "y", "xend", "yend", "linetype", "linewidth"),
115115
name = "geom_segment"
116116
)
117117

0 commit comments

Comments
 (0)