leaflet map not rendering properly in shiny using flexdashboard

Hi, I'm trying to render a raster map in a list, but there is no error in the compilation. However, the map doesn't render.

Thanks


title: "Teste Dash"
output:
flexdashboard::flex_dashboard:
orientation: columns
vertical_layout: fill
runtime: shiny

library(flexdashboard)
library(leaflet)
library(raster)
library(gstat)
library(fields)
library(akima)
library(plyr)
library(automap)
library(ggplot2)
library(plotly)
library(tidyverse)
library(dplyr)
library(data.table)
library(ggpubr)
library(gridExtra)
library(sf)
library(leaflet)
library(fields)
library(raster)
library(rgdal)
library(rasterVis)
library(RColorBrewer)
library(viridis) 
library(ggthemes)


load('data_dash.RData')

Column {.sidebar}

Waiting time between eruptions and the duration of the eruption for the
Old Faithful geyser in Yellowstone National Park, Wyoming, USA.

selectInput("n_breaks", label = "Number of bins:",
            choices = seq(4,36,1), selected = 5)


Column {data-width=650}




Chart A


output$map <- renderLeaflet({ 
                              leaflet() %>% addTiles() %>%
                              addRasterImage(raster.list.tps[[as.numeric(input$n_breaks)]], colors = pal, opacity = 0.6) %>%
                              addLegend(pal = pal, values = values(raster.list.tps[[as.numeric(input$n_breaks)]]),
                              title = "WTD (cm)")
 })

Column {data-width=350}

Chart B



Chart C



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