We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent b38caa3 commit 41587fcCopy full SHA for 41587fc
R/geom-segment.R
@@ -103,15 +103,15 @@ geom_segment <- function(mapping = NULL, data = NULL,
103
#' @export
104
GeomSegment <- ggproto("GeomSegment", Geom,
105
required_aes = c("x", "y", "xend|yend"),
106
- non_missing_aes = c("linetype", "linewidth", "shape"),
+ non_missing_aes = c("linetype", "linewidth"),
107
default_aes = aes(colour = "black", linewidth = 0.5, linetype = 1, alpha = NA),
108
draw_panel = function(self, data, panel_params, coord, arrow = NULL, arrow.fill = NULL,
109
lineend = "butt", linejoin = "round", na.rm = FALSE) {
110
data$xend <- data$xend %||% data$x
111
data$yend <- data$yend %||% data$y
112
data <- check_linewidth(data, snake_class(self))
113
data <- remove_missing(data, na.rm = na.rm,
114
- c("x", "y", "xend", "yend", "linetype", "linewidth", "shape"),
+ c("x", "y", "xend", "yend", "linetype", "linewidth"),
115
name = "geom_segment"
116
)
117
0 commit comments