...
|
...
|
@@ -519,7 +519,7 @@ gs_horizon <- function(res_enrich,
|
519
|
519
|
mutate(gs_description = factor(.data$gs_description, rev(unique(.data$gs_description)))) %>%
|
520
|
520
|
arrange((.data$logp10)) %>%
|
521
|
521
|
ggplot(aes_string(x = "gs_description", y = "logp10")) +
|
522
|
|
- geom_line(aes_string(group = "scenario", col = "scenario"), size = 3, alpha = 0.7) +
|
|
522
|
+ geom_line(aes_string(group = "scenario", col = "scenario"), linewidth = 3, alpha = 0.7) +
|
523
|
523
|
geom_point(aes_string(fill = "z_score"), size = 4, pch = 21) +
|
524
|
524
|
scale_color_brewer(palette = "Set2") +
|
525
|
525
|
scale_fill_gradient2(low = "#313695", mid = "#FFFFE5", high = "#A50026") +
|
...
|
...
|
@@ -542,7 +542,7 @@ gs_horizon <- function(res_enrich,
|
542
|
542
|
mutate(gs_description = factor(.data$gs_description, rev(unique(nicerorder_terms)))) %>%
|
543
|
543
|
arrange(desc(.data$logp10)) %>%
|
544
|
544
|
ggplot(aes_string(x = "gs_description", y = "logp10")) +
|
545
|
|
- geom_line(aes_string(group = "scenario", col = "scenario"), size = 3, alpha = 0.7) +
|
|
545
|
+ geom_line(aes_string(group = "scenario", col = "scenario"), linewidth = 3, alpha = 0.7) +
|
546
|
546
|
scale_color_brewer(palette = "Set2") +
|
547
|
547
|
geom_point(aes_string(fill = "z_score"), size = 4, pch = 21) +
|
548
|
548
|
scale_fill_gradient2(low = "#313695", mid = "#FFFFE5", high = "#A50026") +
|