| 
									
										
										
										
											2021-10-20 15:34:52 +02:00
										 |  |  | # Java script function to replace gene IDs with Ensembl gene links. | 
					
						
							|  |  |  | js_link <- DT::JS("function(row, data) { | 
					
						
							| 
									
										
										
										
											2021-10-01 09:50:04 +02:00
										 |  |  |     let id = data[1]; | 
					
						
							|  |  |  |     var name = data[2]; | 
					
						
							|  |  |  |     if (!name) name = 'Unknown'; | 
					
						
							|  |  |  |     let url = `https://www.ensembl.org/Homo_sapiens/Gene/Summary?g=${id}`; | 
					
						
							|  |  |  |     $('td:eq(1)', row).html(`<a href=\"${url}\" target=\"_blank\">${name}</a>`); | 
					
						
							|  |  |  | }") | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | #' Create a server function for the application. | 
					
						
							|  |  |  | #' | 
					
						
							|  |  |  | #' @param options Global application options. | 
					
						
							|  |  |  | #' @noRd | 
					
						
							|  |  |  | server <- function(options) { | 
					
						
							|  |  |  |     function(input, output, session) { | 
					
						
							|  |  |  |         input_reactives <- input_page_server("input_page", options) | 
					
						
							|  |  |  |         preset <- input_reactives$preset | 
					
						
							|  |  |  |         comparison_gene_ids <- input_reactives$comparison_gene_ids | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         observe({ | 
					
						
							|  |  |  |             updateNavbarPage( | 
					
						
							|  |  |  |                 session, | 
					
						
							|  |  |  |                 "main_page", | 
					
						
							|  |  |  |                 selected = "Results" | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |         }) |> bindEvent(preset(), ignoreInit = TRUE) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         # Compute the results according to the preset. | 
					
						
							|  |  |  |         analysis <- reactive({ | 
					
						
							|  |  |  |             withProgress( | 
					
						
							|  |  |  |                 message = "Analyzing genes", | 
					
						
							|  |  |  |                 value = 0.0, | 
					
						
							|  |  |  |                 { # nolint | 
					
						
							|  |  |  |                     geposan::analyze( | 
					
						
							|  |  |  |                         preset(), | 
					
						
							|  |  |  |                         progress = function(progress) { | 
					
						
							|  |  |  |                             setProgress(progress) | 
					
						
							|  |  |  |                         }, | 
					
						
							|  |  |  |                         include_results = FALSE | 
					
						
							|  |  |  |                     ) | 
					
						
							|  |  |  |                 } | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |         }) |> bindCache(preset()) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         # Rank the results. | 
					
						
							|  |  |  |         ranking <- methods_server("methods", analysis, comparison_gene_ids) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         # Add gene information to the results. | 
					
						
							|  |  |  |         results <- reactive({ | 
					
						
							|  |  |  |             merge( | 
					
						
							|  |  |  |                 ranking(), | 
					
						
							|  |  |  |                 geposan::genes, | 
					
						
							|  |  |  |                 by.x = "gene", | 
					
						
							|  |  |  |                 by.y = "id", | 
					
						
							|  |  |  |                 sort = FALSE | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |         }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         # Apply the filters. | 
					
						
							|  |  |  |         results_filtered <- filters_server("filters", results) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         # Server for the detailed results panel. | 
					
						
							|  |  |  |         results_server("results", results_filtered) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         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-02-24 15:58:24 +01:00
										 |  |  |                 ) | 
					
						
							| 
									
										
										
										
											2021-10-19 15:05:01 +02:00
										 |  |  |             } | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | 
 | 
					
						
							|  |  |  |             geposan::plot_scores( | 
					
						
							|  |  |  |                 ranking(), | 
					
						
							|  |  |  |                 gene_sets = gene_sets, | 
					
						
							|  |  |  |                 max_rank = results_filtered()[, max(rank)] | 
					
						
							| 
									
										
										
										
											2021-12-02 17:22:27 +01:00
										 |  |  |             ) | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |         }) | 
					
						
							| 
									
										
										
										
											2021-11-15 14:22:33 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |         output$rankings_plot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |             preset <- preset() | 
					
						
							| 
									
										
										
										
											2021-11-15 09:35:47 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |             rankings <- list() | 
					
						
							|  |  |  |             methods <- preset$methods | 
					
						
							|  |  |  |             all <- ranking() | 
					
						
							| 
									
										
										
										
											2022-01-13 13:37:02 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |             for (method in methods) { | 
					
						
							|  |  |  |                 weights <- list() | 
					
						
							|  |  |  |                 weights[[method$id]] <- 1.0 | 
					
						
							|  |  |  |                 rankings[[method$name]] <- geposan::ranking(all, weights) | 
					
						
							|  |  |  |             } | 
					
						
							| 
									
										
										
										
											2022-01-13 13:37:02 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |             rankings[["Combined"]] <- all | 
					
						
							| 
									
										
										
										
											2022-01-13 13:37:02 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +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-19 16:24:23 +02:00
										 |  |  |             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-19 16:24:23 +02:00
										 |  |  |             geposan::plot_rankings(rankings, gene_sets) | 
					
						
							|  |  |  |         }) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-22 15:17:02 +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>. ", | 
					
						
							|  |  |  |                     "A Wilcoxon rank sum test with the hypothesis of higher ", | 
					
						
							|  |  |  |                     "than usual scores gives a p-value of ", | 
					
						
							|  |  |  |                     "<b>{num(comparison$p_value, 4)}</b>." | 
					
						
							|  |  |  |                 ) | 
					
						
							|  |  |  |             } | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |             reference_div <- div(HTML( | 
					
						
							|  |  |  |                 comparison_text("reference genes", reference) | 
					
						
							|  |  |  |             )) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |             if (!is.null(comparison)) { | 
					
						
							|  |  |  |                 div( | 
					
						
							|  |  |  |                     reference_div, | 
					
						
							|  |  |  |                     div(HTML(comparison_text("comparison genes", comparison))) | 
					
						
							|  |  |  |                 ) | 
					
						
							|  |  |  |             } else { | 
					
						
							|  |  |  |                 reference_div | 
					
						
							|  |  |  |             } | 
					
						
							|  |  |  |         }) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |         output$boxplot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |             preset <- preset() | 
					
						
							|  |  |  |             gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |             comparison_gene_ids <- comparison_gene_ids() | 
					
						
							| 
									
										
										
										
											2021-12-06 14:24:31 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |             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-19 16:24:23 +02:00
										 |  |  |             geposan::plot_boxplot(ranking(), gene_sets) | 
					
						
							|  |  |  |         }) | 
					
						
							| 
									
										
										
										
											2021-11-15 14:22:33 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |         output$positions_plot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |             preset <- preset() | 
					
						
							|  |  |  |             gene_sets <- list("Reference genes" = preset$reference_gene_ids) | 
					
						
							|  |  |  |             comparison_gene_ids <- comparison_gene_ids() | 
					
						
							| 
									
										
										
										
											2021-11-15 14:22:33 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |             if (length(comparison_gene_ids) >= 1) { | 
					
						
							|  |  |  |                 gene_sets <- c( | 
					
						
							|  |  |  |                     gene_sets, | 
					
						
							|  |  |  |                     list("Comparison genes" = comparison_gene_ids) | 
					
						
							|  |  |  |                 ) | 
					
						
							|  |  |  |             } | 
					
						
							| 
									
										
										
										
											2021-10-15 15:03:40 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |             geposan::plot_scores_by_position( | 
					
						
							|  |  |  |                 ranking(), | 
					
						
							|  |  |  |                 input$positions_plot_chromosome_name, | 
					
						
							|  |  |  |                 gene_sets = gene_sets | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |         }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         gost <- reactive({ | 
					
						
							|  |  |  |             withProgress( | 
					
						
							|  |  |  |                 message = "Querying g:Profiler", | 
					
						
							|  |  |  |                 value = 0.0, | 
					
						
							|  |  |  |                 { # nolint | 
					
						
							|  |  |  |                     setProgress(0.2) | 
					
						
							|  |  |  |                     gprofiler2::gost(results_filtered()[, gene]) | 
					
						
							|  |  |  |                 } | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |         }) | 
					
						
							| 
									
										
										
										
											2022-05-18 17:33:11 +02:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |         output$gost_plot <- plotly::renderPlotly({ | 
					
						
							|  |  |  |             gprofiler2::gostplot( | 
					
						
							|  |  |  |                 gost(), | 
					
						
							|  |  |  |                 capped = FALSE, | 
					
						
							|  |  |  |                 interactive = TRUE | 
					
						
							| 
									
										
										
										
											2022-05-18 17:33:11 +02:00
										 |  |  |             ) | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |         }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         output$gost_details <- DT::renderDT({ | 
					
						
							|  |  |  |             data <- data.table(gost()$result) | 
					
						
							|  |  |  |             setorder(data, p_value) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |             data[, total_ratio := term_size / effective_domain_size] | 
					
						
							|  |  |  |             data[, query_ratio := intersection_size / query_size] | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |             data <- data[, .( | 
					
						
							|  |  |  |                 source, | 
					
						
							|  |  |  |                 term_name, | 
					
						
							|  |  |  |                 total_ratio, | 
					
						
							|  |  |  |                 query_ratio, | 
					
						
							|  |  |  |                 p_value | 
					
						
							|  |  |  |             )] | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |             dt <- DT::datatable( | 
					
						
							|  |  |  |                 data, | 
					
						
							|  |  |  |                 rownames = FALSE, | 
					
						
							|  |  |  |                 colnames = c( | 
					
						
							|  |  |  |                     "Source", | 
					
						
							|  |  |  |                     "Term", | 
					
						
							|  |  |  |                     "Total ratio", | 
					
						
							|  |  |  |                     "Query ratio", | 
					
						
							|  |  |  |                     "p-value" | 
					
						
							|  |  |  |                 ), | 
					
						
							|  |  |  |                 options = list( | 
					
						
							|  |  |  |                     pageLength = 25 | 
					
						
							|  |  |  |                 ) | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |             dt <- DT::formatRound(dt, "p_value", digits = 4) | 
					
						
							|  |  |  |             dt <- DT::formatPercentage( | 
					
						
							|  |  |  |                 dt, | 
					
						
							|  |  |  |                 c("total_ratio", "query_ratio"), | 
					
						
							|  |  |  |                 digits = 1 | 
					
						
							| 
									
										
										
										
											2021-10-20 15:34:52 +02:00
										 |  |  |             ) | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |         }) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |         output$disgenet <- DT::renderDT({ | 
					
						
							|  |  |  |             withProgress( | 
					
						
							|  |  |  |                 message = "Querying DisGeNET", | 
					
						
							|  |  |  |                 value = 0.0, | 
					
						
							|  |  |  |                 { # nolint | 
					
						
							|  |  |  |                     setProgress(0.2) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |                     gene_names <- results_filtered()[, name] | 
					
						
							|  |  |  |                     gene_names <- unique(gene_names[gene_names != ""]) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-22 14:11:02 +02:00
										 |  |  |                     diseases <- suppressMessages( | 
					
						
							|  |  |  |                         disgenet2r::disease_enrichment(gene_names) | 
					
						
							|  |  |  |                     ) | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  | 
 | 
					
						
							|  |  |  |                     data <- data.table(diseases@qresult) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |                     data <- data[, .(Description, Ratio, BgRatio, pvalue)] | 
					
						
							|  |  |  |                     setorder(data, pvalue) | 
					
						
							|  |  |  | 
 | 
					
						
							|  |  |  |                     dt <- DT::datatable( | 
					
						
							|  |  |  |                         data, | 
					
						
							|  |  |  |                         rownames = FALSE, | 
					
						
							|  |  |  |                         colnames = c( | 
					
						
							|  |  |  |                             "Disease", | 
					
						
							|  |  |  |                             "Query ratio", | 
					
						
							|  |  |  |                             "Total ratio", | 
					
						
							|  |  |  |                             "p-value" | 
					
						
							|  |  |  |                         ), | 
					
						
							|  |  |  |                         options = list( | 
					
						
							|  |  |  |                             pageLength = 25 | 
					
						
							|  |  |  |                         ) | 
					
						
							| 
									
										
										
										
											2021-12-08 14:49:50 +01:00
										 |  |  |                     ) | 
					
						
							|  |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |                     dt <- DT::formatRound(dt, "pvalue", digits = 4) | 
					
						
							| 
									
										
										
										
											2021-12-08 14:49:50 +01:00
										 |  |  | 
 | 
					
						
							| 
									
										
										
										
											2022-05-19 16:24:23 +02:00
										 |  |  |                     dt | 
					
						
							|  |  |  |                 } | 
					
						
							|  |  |  |             ) | 
					
						
							|  |  |  |         }) | 
					
						
							|  |  |  |     } | 
					
						
							| 
									
										
										
										
											2021-10-19 14:15:28 +02:00
										 |  |  | } |