| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  | #' Create the UI for the results page. | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | #' | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  | #' @param id ID for namespacing. | 
					
						
							|  |  |  | #' @param options Global options for the application. | 
					
						
							|  |  |  | #' | 
					
						
							|  |  |  | #' @return The UI elements. | 
					
						
							|  |  |  | #' | 
					
						
							|  |  |  | #' @noRd | 
					
						
							|  |  |  | results_ui <- function(id, options) { | 
					
						
							| 
									
										
										
										
											2022-08-18 09:21:48 +02:00
										 |  |  |   ranking_choices <- purrr::lmap(options$methods, function(method) { | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |     l <- list() | 
					
						
							|  |  |  |     l[[method[[1]]$name]] <- method[[1]]$id | 
					
						
							|  |  |  |     l | 
					
						
							|  |  |  |   }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |   ranking_choices <- c(ranking_choices, "Combined" = "combined") | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |   sidebarLayout( | 
					
						
							|  |  |  |     sidebarPanel( | 
					
						
							|  |  |  |       width = 3, | 
					
						
							|  |  |  |       comparison_editor_ui(NS(id, "comparison_editor"), options), | 
					
						
							| 
									
										
										
										
											2022-08-18 11:09:22 +02:00
										 |  |  |       methods_ui(NS(id, "methods"), options) | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |     ), | 
					
						
							|  |  |  |     mainPanel( | 
					
						
							|  |  |  |       width = 9, | 
					
						
							|  |  |  |       tabsetPanel( | 
					
						
							|  |  |  |         type = "pills", | 
					
						
							|  |  |  |         tabPanel( | 
					
						
							|  |  |  |           title = "Overview", | 
					
						
							|  |  |  |           div( | 
					
						
							|  |  |  |             style = "margin-top: 16px", | 
					
						
							|  |  |  |             plotly::plotlyOutput( | 
					
						
							|  |  |  |               NS(id, "rank_plot"), | 
					
						
							|  |  |  |               width = "100%", | 
					
						
							|  |  |  |               height = "600px" | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |           ) | 
					
						
							|  |  |  |         ), | 
					
						
							|  |  |  |         tabPanel( | 
					
						
							| 
									
										
										
										
											2022-08-18 12:21:00 +02:00
										 |  |  |           title = "Gene sets", | 
					
						
							|  |  |  |           div( | 
					
						
							|  |  |  |             style = "margin-top: 16px", | 
					
						
							|  |  |  |             htmlOutput(NS(id, "comparison_text")), | 
					
						
							|  |  |  |             div( | 
					
						
							|  |  |  |               style = "margin-top: 16px;", | 
					
						
							|  |  |  |               plotly::plotlyOutput( | 
					
						
							|  |  |  |                 NS(id, "boxplot"), | 
					
						
							|  |  |  |                 width = "100%", | 
					
						
							|  |  |  |                 height = "600px" | 
					
						
							|  |  |  |               ) | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |           ) | 
					
						
							|  |  |  |         ), | 
					
						
							|  |  |  |         tabPanel( | 
					
						
							|  |  |  |           title = "Methods", | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |           div( | 
					
						
							|  |  |  |             style = "margin-top: 16px", | 
					
						
							|  |  |  |             plotly::plotlyOutput( | 
					
						
							|  |  |  |               NS(id, "rankings_plot"), | 
					
						
							|  |  |  |               width = "100%", | 
					
						
							|  |  |  |               height = "600px" | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |           ) | 
					
						
							|  |  |  |         ), | 
					
						
							|  |  |  |         tabPanel( | 
					
						
							|  |  |  |           title = "Method correlation", | 
					
						
							|  |  |  |           div( | 
					
						
							|  |  |  |             class = "flow-layout", | 
					
						
							|  |  |  |             style = "margin-top: 16px", | 
					
						
							|  |  |  |             selectInput( | 
					
						
							|  |  |  |               NS(id, "ranking_y"), | 
					
						
							|  |  |  |               label = NULL, | 
					
						
							|  |  |  |               choices = ranking_choices | 
					
						
							|  |  |  |             ), | 
					
						
							|  |  |  |             span( | 
					
						
							|  |  |  |               style = paste0( | 
					
						
							|  |  |  |                 "display: inline-block;", | 
					
						
							|  |  |  |                 "margin-right: 12px;", | 
					
						
							|  |  |  |                 "padding: 0.375rem 0.75rem;" | 
					
						
							|  |  |  |               ), | 
					
						
							|  |  |  |               "~" | 
					
						
							|  |  |  |             ), | 
					
						
							|  |  |  |             selectInput( | 
					
						
							|  |  |  |               NS(id, "ranking_x"), | 
					
						
							|  |  |  |               label = NULL, | 
					
						
							|  |  |  |               choices = ranking_choices, | 
					
						
							|  |  |  |               selected = "combined" | 
					
						
							|  |  |  |             ), | 
					
						
							|  |  |  |             div( | 
					
						
							|  |  |  |               style = paste0( | 
					
						
							|  |  |  |                 "display: inline-block;", | 
					
						
							|  |  |  |                 "padding: 0.375rem 0.75rem;" | 
					
						
							|  |  |  |               ), | 
					
						
							|  |  |  |               checkboxInput( | 
					
						
							|  |  |  |                 NS(id, "use_ranks"), | 
					
						
							|  |  |  |                 "Use ranks instead of scores", | 
					
						
							|  |  |  |                 value = TRUE | 
					
						
							|  |  |  |               ) | 
					
						
							|  |  |  |             ), | 
					
						
							|  |  |  |             div( | 
					
						
							|  |  |  |               style = paste0( | 
					
						
							|  |  |  |                 "display: inline-block;", | 
					
						
							|  |  |  |                 "padding: 0.375rem 0.75rem;" | 
					
						
							|  |  |  |               ), | 
					
						
							|  |  |  |               checkboxInput( | 
					
						
							|  |  |  |                 NS(id, "use_sample"), | 
					
						
							|  |  |  |                 "Take random sample of genes", | 
					
						
							|  |  |  |                 value = TRUE | 
					
						
							|  |  |  |               ) | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |           ), | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |           htmlOutput(NS(id, "method_correlation")), | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |           plotly::plotlyOutput( | 
					
						
							|  |  |  |             NS(id, "ranking_correlation_plot"), | 
					
						
							|  |  |  |             width = "100%", | 
					
						
							|  |  |  |             height = "600px" | 
					
						
							|  |  |  |           ) | 
					
						
							|  |  |  |         ), | 
					
						
							|  |  |  |         tabPanel( | 
					
						
							|  |  |  |           title = "Scores by position", | 
					
						
							|  |  |  |           div( | 
					
						
							|  |  |  |             class = "flow-layout", | 
					
						
							|  |  |  |             style = "margin-top: 16px", | 
					
						
							|  |  |  |             selectInput( | 
					
						
							|  |  |  |               NS(id, "positions_plot_chromosome_name"), | 
					
						
							|  |  |  |               label = NULL, | 
					
						
							|  |  |  |               choices = c( | 
					
						
							| 
									
										
										
										
											2023-11-11 09:51:31 +01:00
										 |  |  |                 list( | 
					
						
							|  |  |  |                   "Chromosome overview" = "overview", | 
					
						
							|  |  |  |                   "All chromosomes" = "all" | 
					
						
							|  |  |  |                 ), | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |                 chromosome_choices() | 
					
						
							|  |  |  |               ) | 
					
						
							|  |  |  |             ), | 
					
						
							| 
									
										
										
										
											2023-11-11 09:51:31 +01:00
										 |  |  |             htmlOutput( | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |               NS(id, "positions_plot"), | 
					
						
							| 
									
										
										
										
											2023-11-11 09:51:31 +01:00
										 |  |  |               container = \(...) div(style = "width: 100%; height: 600px", ...) | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |             ) | 
					
						
							|  |  |  |           ) | 
					
						
							|  |  |  |         ), | 
					
						
							| 
									
										
										
										
											2022-08-18 12:21:00 +02:00
										 |  |  |         tabPanel( | 
					
						
							|  |  |  |           title = "Ortholog locations", | 
					
						
							|  |  |  |           div( | 
					
						
							|  |  |  |             style = "margin-top: 16px", | 
					
						
							|  |  |  |             plotly::plotlyOutput( | 
					
						
							|  |  |  |               NS(id, "gene_locations_plot"), | 
					
						
							|  |  |  |               width = "100%", | 
					
						
							|  |  |  |               height = "1200px" | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |           ) | 
					
						
							|  |  |  |         ), | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |         tabPanel( | 
					
						
							|  |  |  |           title = "Detailed results", | 
					
						
							|  |  |  |           details_ui(NS(id, "results")) | 
					
						
							|  |  |  |         ), | 
					
						
							|  |  |  |         tabPanel( | 
					
						
							|  |  |  |           title = "g:Profiler", | 
					
						
							| 
									
										
										
										
											2022-08-18 11:09:22 +02:00
										 |  |  |           gsea_ui(NS(id, "gsea")) | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |         ) | 
					
						
							|  |  |  |       ) | 
					
						
							|  |  |  |     ) | 
					
						
							|  |  |  |   ) | 
					
						
							|  |  |  | } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  | #' Application logic for the results page. | 
					
						
							|  |  |  | #' | 
					
						
							|  |  |  | #' @param id ID for namespacing. | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | #' @param options Global application options. | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  | #' @param analysis A reactive containing the analysis that gets visualized. | 
					
						
							|  |  |  | #' | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | #' @noRd | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  | results_server <- function(id, options, analysis) { | 
					
						
							|  |  |  |   preset <- reactive(analysis()$preset) | 
					
						
							| 
									
										
										
										
											2022-06-22 13:48:37 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |   moduleServer(id, function(input, output, session) { | 
					
						
							| 
									
										
										
										
											2022-06-22 13:48:37 +02:00
										 |  |  |     comparison_gene_ids <- comparison_editor_server( | 
					
						
							|  |  |  |       "comparison_editor", | 
					
						
							|  |  |  |       preset, | 
					
						
							|  |  |  |       options | 
					
						
							|  |  |  |     ) | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  | 
 | 
					
						
							|  |  |  |     # Rank the results. | 
					
						
							| 
									
										
										
										
											2022-08-18 09:21:48 +02:00
										 |  |  |     ranking <- methods_server("methods", options, analysis, comparison_gene_ids) | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  | 
 | 
					
						
							|  |  |  |     genes_with_distances <- merge( | 
					
						
							|  |  |  |       geposan::genes, | 
					
						
							|  |  |  |       geposan::distances[species == "hsapiens"], | 
					
						
							|  |  |  |       by.x = "id", | 
					
						
							|  |  |  |       by.y = "gene" | 
					
						
							|  |  |  |     ) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |     # Add gene information to the results. | 
					
						
							|  |  |  |     results <- reactive({ | 
					
						
							|  |  |  |       merge( | 
					
						
							|  |  |  |         ranking(), | 
					
						
							|  |  |  |         genes_with_distances, | 
					
						
							|  |  |  |         by.x = "gene", | 
					
						
							|  |  |  |         by.y = "id", | 
					
						
							|  |  |  |         sort = FALSE | 
					
						
							|  |  |  |       ) | 
					
						
							|  |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |     # Server for the detailed results panel. | 
					
						
							| 
									
										
										
										
											2022-08-18 11:09:22 +02:00
										 |  |  |     details_server("results", options, results) | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  | 
 | 
					
						
							|  |  |  |     output$rank_plot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |       preset <- preset() | 
					
						
							|  |  |  |       gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |       comparison_gene_ids <- comparison_gene_ids() | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       if (length(comparison_gene_ids) >= 1) { | 
					
						
							|  |  |  |         gene_sets <- c( | 
					
						
							|  |  |  |           gene_sets, | 
					
						
							|  |  |  |           list("Comparison genes" = comparison_gene_ids) | 
					
						
							|  |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-07-22 09:26:43 +02:00
										 |  |  |       geposan::plot_scores(ranking(), gene_sets = gene_sets) | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |     }) | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |     output$rankings_plot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |       preset <- preset() | 
					
						
							| 
									
										
										
										
											2022-05-23 11:24:49 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       rankings <- list() | 
					
						
							|  |  |  |       methods <- preset$methods | 
					
						
							|  |  |  |       all <- ranking() | 
					
						
							| 
									
										
										
										
											2021-11-15 14:22:33 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       for (method in methods) { | 
					
						
							|  |  |  |         weights <- list() | 
					
						
							|  |  |  |         weights[[method$id]] <- 1.0 | 
					
						
							|  |  |  |         rankings[[method$name]] <- geposan::ranking(all, weights) | 
					
						
							|  |  |  |       } | 
					
						
							| 
									
										
										
										
											2021-11-15 09:35:47 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       rankings[["Combined"]] <- all | 
					
						
							| 
									
										
										
										
											2022-01-13 13:37:02 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |       comparison_gene_ids <- comparison_gene_ids() | 
					
						
							| 
									
										
										
										
											2022-01-13 13:37:02 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       if (length(comparison_gene_ids) >= 1) { | 
					
						
							|  |  |  |         gene_sets <- c( | 
					
						
							|  |  |  |           gene_sets, | 
					
						
							|  |  |  |           list("Comparison genes" = comparison_gene_ids) | 
					
						
							|  |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       geposan::plot_rankings(rankings, gene_sets) | 
					
						
							|  |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |     ranking_x <- reactive({ | 
					
						
							|  |  |  |       if (input$ranking_x == "combined") { | 
					
						
							|  |  |  |         ranking() | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  |       } else { | 
					
						
							|  |  |  |         weights <- list() | 
					
						
							|  |  |  |         weights[[input$ranking_x]] <- 1.0 | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |         geposan::ranking(ranking(), weights) | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  |       } | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |     }) | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |     ranking_y <- reactive({ | 
					
						
							|  |  |  |       if (input$ranking_y == "combined") { | 
					
						
							|  |  |  |         ranking() | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  |       } else { | 
					
						
							|  |  |  |         weights <- list() | 
					
						
							|  |  |  |         weights[[input$ranking_y]] <- 1.0 | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |         geposan::ranking(ranking(), weights) | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  |       } | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |     output$method_correlation <- renderText({ | 
					
						
							|  |  |  |       data <- merge( | 
					
						
							|  |  |  |         ranking_x()[, c("gene", "score")], | 
					
						
							|  |  |  |         ranking_y()[, c("gene", "score")], | 
					
						
							|  |  |  |         by = "gene" | 
					
						
							|  |  |  |       ) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       c <- stats::cor( | 
					
						
							|  |  |  |         data$score.x, | 
					
						
							|  |  |  |         data$score.y, | 
					
						
							|  |  |  |         method = "spearman" | 
					
						
							|  |  |  |       ) |> | 
					
						
							|  |  |  |         round(digits = 4) |> | 
					
						
							|  |  |  |         format(nsmall = 4) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       p <- stats::cor.test( | 
					
						
							|  |  |  |         data$score.x, | 
					
						
							|  |  |  |         data$score.y, | 
					
						
							|  |  |  |         method = "spearman" | 
					
						
							|  |  |  |       )$p.value |> | 
					
						
							|  |  |  |         round(digits = 4) |> | 
					
						
							|  |  |  |         format(nsmall = 4) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       HTML(glue::glue( | 
					
						
							|  |  |  |         "Spearman's rank correlation coefficient: ", | 
					
						
							|  |  |  |         "<b>{c}</b>, p = <b>{p}</b>" | 
					
						
							|  |  |  |       )) | 
					
						
							|  |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |     output$ranking_correlation_plot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |       preset <- preset() | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  | 
 | 
					
						
							|  |  |  |       gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |       comparison_gene_ids <- comparison_gene_ids() | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       if (length(comparison_gene_ids) >= 1) { | 
					
						
							|  |  |  |         gene_sets <- c( | 
					
						
							|  |  |  |           gene_sets, | 
					
						
							|  |  |  |           list("Comparison genes" = comparison_gene_ids) | 
					
						
							|  |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-08-18 09:21:48 +02:00
										 |  |  |       method_names <- options$methods |> purrr::lmap(function(method) { | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  |         l <- list() | 
					
						
							|  |  |  |         l[[method[[1]]$id]] <- method[[1]]$name | 
					
						
							|  |  |  |         l | 
					
						
							|  |  |  |       }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       method_names[["combined"]] <- "Combined" | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       geposan::plot_rankings_correlation( | 
					
						
							| 
									
										
										
										
											2022-08-30 10:26:40 +02:00
										 |  |  |         ranking_x(), | 
					
						
							|  |  |  |         ranking_y(), | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  |         method_names[[input$ranking_x]], | 
					
						
							|  |  |  |         method_names[[input$ranking_y]], | 
					
						
							|  |  |  |         gene_sets = gene_sets, | 
					
						
							| 
									
										
										
										
											2022-08-17 16:17:58 +02:00
										 |  |  |         use_ranks = input$use_ranks, | 
					
						
							|  |  |  |         use_sample = input$use_sample | 
					
						
							| 
									
										
										
										
											2022-08-14 18:04:40 +02:00
										 |  |  |       ) | 
					
						
							|  |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |     output$comparison_text <- renderUI({ | 
					
						
							|  |  |  |       reference <- geposan::compare( | 
					
						
							|  |  |  |         ranking(), | 
					
						
							|  |  |  |         preset()$reference_gene_ids | 
					
						
							|  |  |  |       ) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       comparison <- if (!is.null(comparison_gene_ids())) { | 
					
						
							|  |  |  |         geposan::compare(ranking(), comparison_gene_ids()) | 
					
						
							|  |  |  |       } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       num <- function(x, digits) { | 
					
						
							|  |  |  |         format( | 
					
						
							|  |  |  |           round(x, digits = digits), | 
					
						
							|  |  |  |           nsmall = digits, | 
					
						
							|  |  |  |           scientific = FALSE | 
					
						
							|  |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       comparison_text <- function(name, comparison) { | 
					
						
							|  |  |  |         glue::glue( | 
					
						
							|  |  |  |           "The {name} have a mean score of ", | 
					
						
							|  |  |  |           "<b>{num(comparison$mean_score, 4)}</b> ", | 
					
						
							|  |  |  |           "resulting in a mean rank of ", | 
					
						
							|  |  |  |           "<b>{num(comparison$mean_rank, 1)}</b>. ", | 
					
						
							|  |  |  |           "This corresponds to a percent rank of ", | 
					
						
							|  |  |  |           "<b>{num(100 * comparison$mean_percentile, 2)}%</b>. ", | 
					
						
							| 
									
										
										
										
											2022-06-03 17:56:14 +02:00
										 |  |  |           "A Wilcoxon rank sum test gives an estimated score difference ", | 
					
						
							|  |  |  |           "between <b>{num(comparison$test_result$conf.int[1], 3)}</b> and ", | 
					
						
							|  |  |  |           "<b>{num(comparison$test_result$conf.int[2], 3)}</b> with a 95% ", | 
					
						
							|  |  |  |           "confidence. This corresponds to a p-value of ", | 
					
						
							|  |  |  |           "<b>{num(comparison$test_result$p.value, 4)}</b>." | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							| 
									
										
										
										
											2022-01-13 13:37:02 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       reference_div <- div(HTML( | 
					
						
							|  |  |  |         comparison_text("reference genes", reference) | 
					
						
							|  |  |  |       )) | 
					
						
							| 
									
										
										
										
											2022-01-13 13:37:02 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       if (!is.null(comparison)) { | 
					
						
							|  |  |  |         div( | 
					
						
							|  |  |  |           reference_div, | 
					
						
							| 
									
										
										
										
											2022-08-18 12:21:00 +02:00
										 |  |  |           div( | 
					
						
							|  |  |  |             style = "margin-top: 16px;", | 
					
						
							|  |  |  |             HTML(comparison_text("comparison genes", comparison)) | 
					
						
							|  |  |  |           ) | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |         ) | 
					
						
							|  |  |  |       } else { | 
					
						
							|  |  |  |         reference_div | 
					
						
							|  |  |  |       } | 
					
						
							|  |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |     output$boxplot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |       preset <- preset() | 
					
						
							|  |  |  |       gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |       comparison_gene_ids <- comparison_gene_ids() | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       if (length(comparison_gene_ids) >= 1) { | 
					
						
							|  |  |  |         gene_sets <- c( | 
					
						
							|  |  |  |           gene_sets, | 
					
						
							|  |  |  |           list("Comparison genes" = comparison_gene_ids) | 
					
						
							|  |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							| 
									
										
										
										
											2021-12-06 14:24:31 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       geposan::plot_boxplot(ranking(), gene_sets) | 
					
						
							|  |  |  |     }) | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-08-04 11:54:52 +02:00
										 |  |  |     output$gene_locations_plot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |       preset <- preset() | 
					
						
							|  |  |  |       gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |       comparison_gene_ids <- comparison_gene_ids() | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       if (length(comparison_gene_ids) >= 1) { | 
					
						
							|  |  |  |         gene_sets <- c( | 
					
						
							|  |  |  |           gene_sets, | 
					
						
							|  |  |  |           list("Comparison genes" = comparison_gene_ids) | 
					
						
							|  |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       geposan::plot_positions( | 
					
						
							|  |  |  |         preset$species_ids, | 
					
						
							|  |  |  |         gene_sets, | 
					
						
							|  |  |  |         reference_gene_ids = preset$reference_gene_ids | 
					
						
							|  |  |  |       ) | 
					
						
							|  |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2023-11-11 09:51:31 +01:00
										 |  |  |     output$positions_plot <- renderUI({ | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       preset <- preset() | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2023-11-11 09:51:31 +01:00
										 |  |  |       if (input$positions_plot_chromosome_name == "overview") { | 
					
						
							|  |  |  |         geposan::plot_chromosomes(ranking()) | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |       } else { | 
					
						
							| 
									
										
										
										
											2023-11-11 09:51:31 +01:00
										 |  |  |         gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |         comparison_gene_ids <- comparison_gene_ids() | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2023-11-11 09:51:31 +01:00
										 |  |  |         if (length(comparison_gene_ids) >= 1) { | 
					
						
							|  |  |  |           gene_sets <- c( | 
					
						
							|  |  |  |             gene_sets, | 
					
						
							|  |  |  |             list("Comparison genes" = comparison_gene_ids) | 
					
						
							|  |  |  |           ) | 
					
						
							|  |  |  |         } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         chromosome <- if (input$positions_plot_chromosome_name == "all") { | 
					
						
							|  |  |  |           NULL | 
					
						
							|  |  |  |         } else { | 
					
						
							|  |  |  |           input$positions_plot_chromosome_name | 
					
						
							|  |  |  |         } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         geposan::plot_scores_by_position( | 
					
						
							|  |  |  |           ranking(), | 
					
						
							|  |  |  |           chromosome_name = chromosome, | 
					
						
							|  |  |  |           gene_sets = gene_sets | 
					
						
							|  |  |  |         ) | 
					
						
							|  |  |  |       } | 
					
						
							| 
									
										
										
										
											2022-05-26 12:44:09 +02:00
										 |  |  |     }) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-08-18 11:09:22 +02:00
										 |  |  |     gsea_server("gsea", results) | 
					
						
							| 
									
										
										
										
											2022-08-17 17:09:38 +02:00
										 |  |  |   }) | 
					
						
							|  |  |  | } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  | #' Generate a named list for choosing chromosomes. | 
					
						
							|  |  |  | #' @noRd | 
					
						
							|  |  |  | chromosome_choices <- function() { | 
					
						
							|  |  |  |   choices <- purrr::lmap( | 
					
						
							|  |  |  |     unique(geposan::genes$chromosome), | 
					
						
							|  |  |  |     function(name) { | 
					
						
							|  |  |  |       choice <- list(name) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       names(choice) <- paste0( | 
					
						
							|  |  |  |         "Chromosome ", | 
					
						
							|  |  |  |         name | 
					
						
							|  |  |  |       ) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |       choice | 
					
						
							|  |  |  |     } | 
					
						
							|  |  |  |   ) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |   choices[order(suppressWarnings(sapply(choices, as.integer)))] | 
					
						
							| 
									
										
										
										
											2021-10-19 14:15:28 +02:00
										 |  |  | } |