Я пытаюсь отобразить растр над моим шейп-файлом в моем блестящем приложении. Вот мой подход.
# Load libraries and create sample data
library(raster)
library(shiny)
library(dplyr)
library(leaflet)
library(ggplot2)
library(ggthemes)
library(tmap)
fr.shp <- getData('GADM', country='FRA', level=1)
coords <- data.frame(coordinates(fr.shp))
names(coords) <- c('lon', 'lat')
dat.df <- expand.grid(lon = coords[, 1],
seasonID = c('winter', 'summer'),
business = c('train', 'bus', 'taxi'),
variable = c('modP', 'modT'),
YearRef = 2001:2003)
dat.df1 <- coords %>% dplyr::left_join(dat.df) %>% dplyr::mutate(value = rnorm(n()))
Ниже мое блестящее приложение, которое отображает значения для заданной комбинации сезона ID, businees, variable и YearRef. Код, который я закомментировал, должен был также отобразить шейп-файл, над которым должен быть построен растр. Однако это не работает.
ui <- fluidPage(
titlePanel('my shiny'),
sidebarLayout(position = 'left',
sidebarPanel(
selectInput(inputId = 'seasonRef', label = 'Select season', choices = c('winter','summer'), selected = 'Kharif'),
selectInput(inputId = 'transport', label = 'Select transport',
choices = c('train','bus','taxi'), selected = 'train'),
checkboxGroupInput(inputId = 'type', label = NULL,
choiceNames = c('modP','modT'),
choiceValues = c('modP','modT'),
width = '400px', selected = 'modP'),
sliderInput('yearRef','Select Year',min=2001,max=2003,value=1)
),
mainPanel(
tabsetPanel(
tabPanel('myplots', plotOutput(outputId = 'rast')),
leafletOutput("my_tmap")
)
)
)
)
server <- function(input, output) {
tempI <- reactive({dat.df1 %>% dplyr::filter(seasonID == input$seasonRef &
business == input$transport &
YearRef == input$yearRef &
variable == input$type)})
output$rast <- renderPlot({
ggplot() + geom_raster(data = tempI(), aes(x = lon, y = lat, fill = value)) +
theme_map() + coord_equal() + scale_fill_viridis_c(option = 'C')
})
# tmap_mode("view")
# output$my_tmap = renderLeaflet({
# qtm(fr.shp)})
}
shinyApp(ui, server)
Я показываю этот вопрос, но это позволяет использовать только фоновый шейп-файл вместо моего собственного шейп-файла.
Наложение шейп-файлов или растра поверх интерактивногокарты