I create this plot:
I simply want to change the Legend so it reads "Departure" instead of "grp" and instead of A, B, C, I will have labels "Minor, Moderate, Major".
g <- ggplot(dfq, aes(x)) +
coord_cartesian(clip = "off", expand = FALSE) +
labs(x = NULL, y = NULL) +
theme_minimal(base_size = 20, base_family = "Roboto") +
theme(
panel.grid.major.x = element_blank(),
panel.grid.minor = element_blank(),
legend.position = "bottom",
axis.text.x = element_blank()
)
## calculate boxplotstat manually
## colors
cols <- c("#1a816d", "#f0cf77", "#da2f31")
fill <- "#7ac0af"
if (input$trend == "Increasing") {
## create quantiles to draw segment next to boxplot
thresholds <- data.frame(
grp = as.factor(c("A", "B", "C")),
lwr = quantile(pdat1()$val2, probs = c(0, .75, .95), na.rm = TRUE),
upr = quantile(pdat1()$val2, probs = c(.75, .95, 1), na.rm = TRUE)
)
## set color for selected site
q <- as.numeric(thresholds$grp[rv$perc >= thresholds$lwr & rv$perc <= thresholds$upr])
pnt <- cols[q]
g +
## whiskers
geom_linerange(
data = dfq, aes(ymin = y75, ymax = y0),color = cols[1], linewidth = 1
) +
geom_linerange(
data = dfq, aes(ymin = y95, ymax = y75), color = cols[2], linewidth = 1
) +
geom_linerange(
data = dfq, aes(ymin = y100, ymax = y95), color = cols[3], linewidth = 1
) +
geom_boxplot(
data = dfq, aes(ymin = y25, lower = y25, middle = y50, upper = y75, ymax = y75),
stat = "identity", fill = fill, color = cols[1], linewidth = 1
) +
## median
geom_boxplot(
data = dfq, aes(ymin = y50, lower = y50, middle = y50, upper = y50, ymax = y50),
stat = "identity", linewidth = 1
) +
## outlier
geom_point(data = dplyr::filter(pdat1(), val2 < dfq$y0), aes(x = 1.2, y = val2), color = cols[1]) +
geom_point(data = dplyr::filter(pdat1(), val2 > dfq$y100), aes(x = 1.2, y = val2), color = cols[3]) +
## horizontal indicator
geom_hline(
aes(yintercept = rv$perc),
color = "grey30", lwd = 1.5, linetype = "23", lineend = "round", show.legend = FALSE
) +
## legend strip
geom_linerange(data = thresholds, aes(x = 0.55, ymin = lwr, ymax = upr, color = grp), linewidth = 6) +
## selected site
geom_point(
aes(x = 0.58, y = rv$perc, col = input$Location), stat = "unique",
shape = 21, color = "white", fill = pnt, stroke = 1, size = 5
) +
scale_color_manual(values = cols)
If I simply try to substitute "grp" for "Departure"
#grp = as.factor(c("A", "B", "C")),
Departure = as.factor(c("A", "B", "C")),
## legend strip
# geom_linerange(data = thresholds, aes(x = 0.55, ymin = lwr, ymax = upr, color = grp), linewidth = 6) +
## legend strip
geom_linerange(data = thresholds, aes(x = 0.55, ymin = lwr, ymax = upr, color = Departure), linewidth = 6) +
I get this error
Warning: Error in geom_point: Problem while setting up geom aesthetics.
ℹ Error occurred in the 10th layer.
Caused by error in `check_aesthetics()`:
! Aesthetics must be either length 1 or the same as the data (1).
✖ Fix the following mappings: `fill`.
198: <Anonymous>
197: signalCondition
196: signal_abort
195: rlang::abort
194: cli::cli_abort
193: handlers[[1L]]
192: <Anonymous>
191: signalCondition
190: signal_abort
189: rlang::abort
188: cli::cli_abort
187: check_aesthetics
186: use_defaults
185: self$geom$use_defaults
184: compute_geom_2
183: l$compute_geom_2
182: f
175: by_layer
174: ggplot_build.ggplot
172: print.ggplot
167: func
165: f
164: Reduce
155: do
154: hybrid_chain
126: drawPlot
112: <reactive:plotObj>
96: drawReactive
83: renderFunc
82: output$plot2
1: runApp
Input to asJSON(keep_vec_names=TRUE) is a named vector. In a future version of jsonlite, this option will not be supported, and named vectors will be translated into arrays instead of objects. If you want JSON object output, please use a named list instead. See ?toJSON.
I am not sure what is going on. The plot draws just fine until I change the "grp" to "Departure"
Thanks for any help!!