Template for r-shinylive Quarto document

#| '!! shinylive warning !!': |
#|   shinylive does not work in self-contained HTML documents.
#|   Please set `embed-resources: false` in your metadata.
#| standalone: true

library(tidyverse)
library(leaflet)
library(leaflet.extras2)
library(tigris)
library(sf)
library(shiny)
library(shinylive)

ui <- fluidPage(
  sliderInput("n", "Number:", 1, 100, 50),
  plotOutput("plot")
)

server <- function(input, output) {
  output$plot <- renderPlot({
    hist(rnorm(input$n))
  })
}

shinyApp(ui, server)