The example below (an app.R file and a markdown help file) demonstrate the issue, at least when I run it from RStudio. With the default theme and most others, the dateInput field opens downward, but with cyborg, darkly and a few others it opens upward and runs out of room (at least on Firefox and Chrome). The upload button only seems to support images, so I'll have to paste the code in here.
app.R:
###############################################################################################
# This Shiny web application is designed to demonstrate an issue with dateInput spacing under #
# some themes (including darkly and cyborg) but not others (including the default theme). #
# #
# Author: Paul A. Rubin (rubin@msu.edu) #
###############################################################################################
library(markdown) # required to fix an installation problem on shinyapps.io
library(shiny)
library(shinythemes)
# Set a title for the application.
appTitle <- "Date Input Example"
# Set the version number here for display in the footer.
version <- "1.0"
############################################
# This section defines the user interface. #
############################################
ui <- navbarPage(
"",
id = "navbar",
windowTitle = appTitle,
header = tags$head(
# This suppresses red error messages in the UI.
tags$style(type="text/css",
".shiny-output-error { visibility: hidden; }",
".shiny-output-error:before { visibility: hidden; }"
),
# This positions notifications center stage.
tags$style(
HTML(".shiny-notification {
position:fixed;
top: calc(20%);
left: calc(50%);
}
"
)
)
),
useShinyjs(),
tabPanel(
"Whatever",
themeSelector(),
includeMarkdown("help.md"),
fluidRow(
column(
width = 3,
wellPanel(
dateInput(
"mrt_start",
"Select the start date:",
format = "mm-dd-yyyy",
startview = "month"
)
)#,
)
)
)
)
###########################################
# This section provides the server logic. #
###########################################
server <- function(input, output) {
}
# This runs the application .
shinyApp(ui = ui, server = server)
help.md:
# Your Ad Here $10
Use this tab to do something or other, we're not exactly sure what.
When using the date inputs, click the month to get an annual calendar and click the year to get a span of years. You can also just type a date in the control.