R Shiny Server not rendering any Apps

Hi Everyone,

I noticed my Shiny Server does not render any App on it. Even generic examples!

I get this message each time.

I suspect its the Shiny Server Version I have installed. Does this App render on your Shiny Server?

  library(shiny)
  library(fresh)
  
  ui <- fluidPage(
    
    use_googlefont("Ubuntu"),
    use_theme(create_theme(
      theme = "default",
      bs_vars_font(
        family_sans_serif = "'Ubuntu'"
      )
    )),
    bs_vars_wells(bg = "#00000"),
    
    
    
    tags$h1("Use a google font (online demo)"),
    fluidRow(
      wellPanel(
        "THis is a well panel"
      ),
      column(
        width = 6,
        tags$h2("Second level title"),
        tags$h3("Third level title"),
        tags$h4("Fourth level title"),
        tags$h5("Fifth level title"),
        tags$h6("Sixth level title"),
        tags$b("Bold text"),
        tags$p(
          "Lorem ipsum dolor sit amet, consectetur adipiscing elit,",
          " sed do eiusmod tempor incididunt ut labore et dolore magna aliqua.",
          "Ut enim ad minim veniam, quis nostrud exercitation ullamco",
          " laboris nisi ut aliquip ex ea commodo consequat.",
          "Duis aute irure dolor in reprehenderit in voluptate velit",
          " esse cillum dolore eu fugiat nulla pariatur.",
          "Excepteur sint occaecat cupidatat non proident, sunt in",
          " culpa qui officia deserunt mollit anim id est laborum."
        )
      ),
      column(
        width = 6,
        textInput("caption", "Caption", "Data Summary"),
        actionButton("goButton", "Go!"),
        checkboxGroupInput("variable", "Variables to show:",
                           c("Cylinders" = "cyl",
                             "Transmission" = "am",
                             "Gears" = "gear")),
        selectInput("variable", "Variable:",
                    c("Cylinders" = "cyl",
                      "Transmission" = "am",
                      "Gears" = "gear"))
      )
    )
  )
  
  server <- function(input, output, session) {
    
  }
  
  shinyApp(ui, server)

This topic was automatically closed 54 days after the last reply. New replies are no longer allowed.