inst/shiny/ui/ui_auc.R

shiny::navbarMenu("AUCs Via Bootstrapping",
                  shiny::tabPanel("T-tests & AUC",
                                  DT::dataTableOutput(
                                    "ttest") %>% shinycssloaders::withSpinner()),
                  shiny::tabPanel("Boxplots for the bootstrapped AUCs",
                                  shiny::sidebarPanel(
                                    shiny::pickerInput('bootsigs',
                                                       "Select Signatures",
                                  choices = siglist,
                                  options = list('actions-box' = TRUE),
                                  multiple = TRUE, selected = NULL),
                                  shiny::actionButton('bootplot',
                                                      "Plot Bootstrapped AUCs")),
                                  shiny::mainPanel(plotOutput("bootbox",
                                                              height = 600))),
                  shiny::tabPanel("Separate ROC plots, 95% CI Bands",
                                  shiny::sidebarPanel(
                                    shinyWidgets::pickerInput(
                                      'singroc',
                                      'Select Signature(s)',
                                      choices = siglist,
                                      options = list('actions-box' = TRUE),
                                      multiple = TRUE, selected = NULL),
                                    shiny::actionButton("rocplot",
                                                        "Plot ROC Curve")),
                                  shiny::mainPanel(
                                    shiny::plotOutput("rocsep", height = 450)
                                    )
                                  )
                  )

Try the TBSignatureProfiler package in your browser

Any scripts or data that you put into this service are public.

TBSignatureProfiler documentation built on Nov. 8, 2020, 6:56 p.m.