mirror of
				https://github.com/johrpan/ubigen.git
				synced 2025-10-26 19:57:24 +01:00 
			
		
		
		
	Add outputs for custom genes
This commit is contained in:
		
							parent
							
								
									5f5670171d
								
							
						
					
					
						commit
						7f69b26a49
					
				
					 3 changed files with 95 additions and 11 deletions
				
			
		
							
								
								
									
										29
									
								
								R/plots.R
									
										
									
									
									
								
							
							
						
						
									
										29
									
								
								R/plots.R
									
										
									
									
									
								
							|  | @ -24,7 +24,7 @@ overview_plot <- function(ranked_data, | ||||||
|       yaxis = list(title = "Score") |       yaxis = list(title = "Score") | ||||||
|     ) |     ) | ||||||
| 
 | 
 | ||||||
|   if (!is.null(highlighted_genes)) { |   if (length(highlighted_genes) > 0) { | ||||||
|     figure <- figure |> |     figure <- figure |> | ||||||
|       plotly::add_markers( |       plotly::add_markers( | ||||||
|         data = ranked_data[gene %chin% highlighted_genes], |         data = ranked_data[gene %chin% highlighted_genes], | ||||||
|  | @ -44,6 +44,33 @@ overview_plot <- function(ranked_data, | ||||||
|   figure |   figure | ||||||
| } | } | ||||||
| 
 | 
 | ||||||
|  | #' Create a plot comparing some genes with the overall ranking. | ||||||
|  | #' | ||||||
|  | #' @param ranked_data The ranking to visualize. | ||||||
|  | #' @param highlighted_genes Genes that will be compared. | ||||||
|  | #' | ||||||
|  | #' @return A `plotly` figure. | ||||||
|  | #' @noRd | ||||||
|  | box_plot <- function(ranked_data, highlighted_genes) { | ||||||
|  |   data <- data.table::copy(ranked_data) | ||||||
|  |   data[, group := data.table::fifelse( | ||||||
|  |     gene %chin% highlighted_genes, | ||||||
|  |     "Your genes", | ||||||
|  |     "Other genes" | ||||||
|  |   )] | ||||||
|  | 
 | ||||||
|  |   plotly::plot_ly() |> | ||||||
|  |     plotly::add_boxplot( | ||||||
|  |       data = data, | ||||||
|  |       x = ~score, | ||||||
|  |       y = ~group, | ||||||
|  |       boxpoints = FALSE | ||||||
|  |     ) |> plotly::layout( | ||||||
|  |       xaxis = list(title = "Score"), | ||||||
|  |       yaxis = list(title = "") | ||||||
|  |     ) | ||||||
|  | } | ||||||
|  | 
 | ||||||
| #' Create plot showing the distribution of scores using `plotly`. | #' Create plot showing the distribution of scores using `plotly`. | ||||||
| #' | #' | ||||||
| #' @param ranked_data Data on genes with precomputed ranks. | #' @param ranked_data Data on genes with precomputed ranks. | ||||||
|  |  | ||||||
							
								
								
									
										49
									
								
								R/server.R
									
										
									
									
									
								
							
							
						
						
									
										49
									
								
								R/server.R
									
										
									
									
									
								
							|  | @ -1,6 +1,6 @@ | ||||||
| #' Server implementing the main user interface. | #' Server implementing the main user interface. | ||||||
| #' @noRd | #' @noRd | ||||||
| server <- function(input, output) { | server <- function(input, output, session) { | ||||||
|   ranked_data <- reactive({ |   ranked_data <- reactive({ | ||||||
|     total_weight <- abs(input$cross_sample_weight) + abs(input$sd_expression) |     total_weight <- abs(input$cross_sample_weight) + abs(input$sd_expression) | ||||||
|     data <- data.table::copy(ubigen::genes) |     data <- data.table::copy(ubigen::genes) | ||||||
|  | @ -10,6 +10,9 @@ server <- function(input, output) { | ||||||
|         input$sd_expression * sd_expression_normalized) / |         input$sd_expression * sd_expression_normalized) / | ||||||
|         total_weight] |         total_weight] | ||||||
| 
 | 
 | ||||||
|  |     # Normalize scores to be between 0.0 and 1.0. | ||||||
|  |     data[, score := (score - min(score)) / (max(score) - min(score))] | ||||||
|  | 
 | ||||||
|     data.table::setorder(data, -score) |     data.table::setorder(data, -score) | ||||||
|     data[, rank := .I] |     data[, rank := .I] | ||||||
|     data[, percentile := 1 - rank / max(rank)] |     data[, percentile := 1 - rank / max(rank)] | ||||||
|  | @ -24,6 +27,50 @@ server <- function(input, output) { | ||||||
|     highlighted_genes = custom_genes() |     highlighted_genes = custom_genes() | ||||||
|   )) |   )) | ||||||
| 
 | 
 | ||||||
|  |   observeEvent(custom_genes(), | ||||||
|  |     { # nolint | ||||||
|  |       if (length(custom_genes()) > 0) { | ||||||
|  |         updateTabsetPanel(session, "custom_genes_panel", selected = "show") | ||||||
|  |       } else { | ||||||
|  |         updateTabsetPanel(session, "custom_genes_panel", selected = "hide") | ||||||
|  |       } | ||||||
|  |     }, | ||||||
|  |     ignoreNULL = FALSE | ||||||
|  |   ) | ||||||
|  | 
 | ||||||
|  |   output$custom_genes_synopsis <- renderText({ | ||||||
|  |     comparison_gene_ids <- custom_genes() | ||||||
|  | 
 | ||||||
|  |     if (length(comparison_gene_ids) > 1) { | ||||||
|  |       reference <- ranked_data()[!gene %chin% comparison_gene_ids, score] | ||||||
|  |       comparison <- ranked_data()[gene %chin% comparison_gene_ids, score] | ||||||
|  | 
 | ||||||
|  |       p_value <- stats::wilcox.test( | ||||||
|  |         x = comparison, | ||||||
|  |         y = reference, | ||||||
|  |         alternative = "greater" | ||||||
|  |       )$p.value | ||||||
|  | 
 | ||||||
|  |       reference_median <- stats::median(reference) | ||||||
|  |       comparison_median <- stats::median(comparison) | ||||||
|  | 
 | ||||||
|  |       HTML(glue::glue( | ||||||
|  |         "The p-value for the alternative hypothesis that your genes have ", | ||||||
|  |         "higher scores than other genes is <b>{format(round(p_value, ", | ||||||
|  |         "digits = 4), nsmall = 4, scientific = FALSE)}</b>. This value was ", | ||||||
|  |         "computed using a Wilcoxon rank sum test. The median score of your ", | ||||||
|  |         "genes is <b>{format(round(comparison_median, digits = 2), ", | ||||||
|  |         "nsmall = 2, scientific = FALSE)}</b> compared to a median score of ", | ||||||
|  |         "<b>{format(round(reference_median, digits = 2), nsmall = 2, ", | ||||||
|  |         "scientific = FALSE)}</b> of the other genes." | ||||||
|  |       )) | ||||||
|  |     } | ||||||
|  |   }) | ||||||
|  | 
 | ||||||
|  |   output$custom_genes_boxplot <- plotly::renderPlotly( | ||||||
|  |     box_plot(ranked_data(), custom_genes()) | ||||||
|  |   ) | ||||||
|  | 
 | ||||||
|   output$scores_plot <- plotly::renderPlotly(scores_plot( |   output$scores_plot <- plotly::renderPlotly(scores_plot( | ||||||
|     ranked_data(), |     ranked_data(), | ||||||
|     highlighted_genes = custom_genes() |     highlighted_genes = custom_genes() | ||||||
|  |  | ||||||
							
								
								
									
										28
									
								
								R/ui.R
									
										
									
									
									
								
							
							
						
						
									
										28
									
								
								R/ui.R
									
										
									
									
									
								
							|  | @ -20,12 +20,12 @@ ui <- function() { | ||||||
|           selectInput( |           selectInput( | ||||||
|             "cross_sample_metric", |             "cross_sample_metric", | ||||||
|             verticalLayout( |             verticalLayout( | ||||||
|                strong("Expression across samples"), |               strong("Expression across samples"), | ||||||
|                paste0( |               paste0( | ||||||
|                  "Proportion samples in which the gene is expressed above the ", |                 "Proportion samples in which the gene is expressed above the ", | ||||||
|                  "selected threshold. Select a method and a weight for the ", |                 "selected threshold. Select a method and a weight for the ", | ||||||
|                  "final score." |                 "final score." | ||||||
|                ) |               ) | ||||||
|             ), |             ), | ||||||
|             list( |             list( | ||||||
|               "Above 95th percentile" = "above_95", |               "Above 95th percentile" = "above_95", | ||||||
|  | @ -55,10 +55,20 @@ ui <- function() { | ||||||
|         ), |         ), | ||||||
|         mainPanel( |         mainPanel( | ||||||
|           width = 9, |           width = 9, | ||||||
|           h3("Distribution of scores"), |           h3("Overview"), | ||||||
|           h4("Overview"), |  | ||||||
|           plotly::plotlyOutput("overview_plot", height = "200px"), |           plotly::plotlyOutput("overview_plot", height = "200px"), | ||||||
|           h4("Focus on top genes"), |           tabsetPanel( | ||||||
|  |             id = "custom_genes_panel", | ||||||
|  |             type = "hidden", | ||||||
|  |             tabPanelBody("hide"), | ||||||
|  |             tabPanelBody( | ||||||
|  |               "show", | ||||||
|  |               h3("Your genes"), | ||||||
|  |               htmlOutput("custom_genes_synopsis"), | ||||||
|  |               plotly::plotlyOutput("custom_genes_boxplot") | ||||||
|  |             ) | ||||||
|  |           ), | ||||||
|  |           h3("Focus on top genes"), | ||||||
|           div(paste0( |           div(paste0( | ||||||
|             "Click or drag within the figure to select genes of ", |             "Click or drag within the figure to select genes of ", | ||||||
|             "interest." |             "interest." | ||||||
|  |  | ||||||
		Loading…
	
	Add table
		Add a link
		
	
		Reference in a new issue