geposanui/shiny/ui.R

116 lines
3.5 KiB
R
Raw Normal View History

2021-06-24 22:38:16 +02:00
library(DT)
2021-10-07 12:18:47 +02:00
library(plotly)
2021-10-07 12:59:04 +02:00
library(rclipboard)
2021-06-24 22:38:16 +02:00
library(shiny)
ui <- fluidPage(
shinyjs::useShinyjs(),
2021-10-07 12:59:04 +02:00
rclipboardSetup(),
2021-06-24 22:38:16 +02:00
titlePanel("TPE-OLD candidates"),
2021-10-15 11:46:15 +02:00
sidebarLayout(
sidebarPanel(
width = 3,
2021-08-29 15:53:31 +02:00
h3("Filter criteria"),
2021-08-29 13:25:12 +02:00
selectInput(
"species",
"Species to include",
choices = list(
2021-09-30 12:54:40 +02:00
"Replicatively aging" = "replicative",
"All qualified" = "all"
2021-08-29 13:25:12 +02:00
)
),
2021-10-15 11:46:15 +02:00
uiOutput("n_species_slider"),
sliderInput(
"cutoff",
"Cut-off score",
post = "%",
min = 0,
max = 100,
step = 1,
value = 50
),
h3("Methods"),
actionButton(
"optimize_button",
"Find optimal weights",
icon = icon("check-double")
),
div(style = "margin-top: 16px"),
2021-10-15 09:26:57 +02:00
lapply(methods, function(method) {
verticalLayout(
checkboxInput(
method$id,
span(
method$description,
style = "font-weight: bold"
),
value = TRUE
),
sliderInput(
sprintf("%s_weight", method$id),
NULL,
post = "%",
min = 0,
max = 100,
step = 1,
value = 100
)
2021-10-15 09:26:57 +02:00
)
}),
2021-10-11 11:14:08 +02:00
checkboxInput(
"penalize",
"Penalize missing values"
2021-10-15 11:46:15 +02:00
),
2021-06-24 22:38:16 +02:00
),
2021-10-15 11:46:15 +02:00
mainPanel(
2021-10-15 13:59:00 +02:00
tabsetPanel(
type = "pills",
header = div(style = "margin-top: 16px"),
tabPanel(
"Results",
2021-10-15 15:03:40 +02:00
uiOutput("copy"),
2021-10-15 13:59:00 +02:00
div(
style = "margin-top: 16px",
DTOutput("genes", height = "1000px")
)
),
tabPanel(
"Positions",
plotlyOutput(
"scatter",
width = "100%",
height = "600px"
)
),
tabPanel(
2021-10-15 15:03:40 +02:00
"Assessment",
htmlOutput("assessment_synopsis"),
div(
style = "margin-top: 16px",
plotlyOutput(
"rank_plot",
width = "100%",
height = "600px"
)
),
2021-10-15 13:59:00 +02:00
),
tabPanel(
"Analysis",
checkboxInput(
"enable_gost",
"Perform a gene set enrichment analysis on the \
filtered result genes."
),
conditionalPanel(
"input.enable_gost == true",
plotlyOutput(
"gost",
width = "100%",
height = "600px"
)
)
2021-10-07 12:42:36 +02:00
)
2021-10-07 12:18:47 +02:00
)
2021-06-24 22:38:16 +02:00
)
)
)