这是我第一次使用stackoverflow提出问题,所以我希望以下内容足够清楚:
我正在制作一个Shiny应用程序,在其中使用Leaflet绘制数据。该图当前由三层组成(类型= a,类型= b,类型= a + b),可以通过使用复选框进行选择,并且我还添加了切片器以选择持续时间。
现在,一切正常,但是我想添加一个DaterangeInput。
我的数据框由五个变量组成(以最简单的形式) 名称/位置/类型/持续时间/日期。同一个名称可以具有许多观测值,因为它们是事件,而同一个名称的不同观测值可以具有type = a或type = b。
对于我当前正在运行的Shiny应用程序,我通过group_by(name)对我的原始数据进行了子集化,用于类型= a,类型= b和类型= a + b。这样,我得到了三个图层,可以通过复选框组进行选择。子集数据帧随后被用于反应函数中,以在使用滑块更改我的Leaflet映射上的标记量时起作用。
我现在想做的是先使用daterangeInput子集我的原始数据帧。原因是日期是唯一的唯一变量,这就是为什么我希望将其作为第一个过滤器,但是直到我制作了一个运行正常的Shiny应用程序之后才意识到这一点,我只想添加一个小东西:P < / p>
这是我的代码的简化版本
ui <- fluidPage(
titlePanel(Title),
sidebarLayout(
sidebarPanel(
#slider for number of events
sliderInput(inputId = "events",
label = "number:",
min = 1, max = 100,
value = c(1,100),
step = 1),
#type a and/or b
checkboxInput(inputId = "a",
label = "a",
value = TRUE),
checkboxInput(inputId = "b",
label = "b",
value = TRUE),
#Daterange for events to plot
dateRangeInput(inputId = "date",
label = "from - until:",
start = 1-1-2018,
end = 31-12-2019,
min = 1-1-2018,
max = 31-12-2019,
format = "dd/mm/yyyy",
separator = " - "),
),
#printing map
mainPanel(
leafletOutput(outputId = "map", width = "100%", height = 900)
)
)
)
server <- function(input, output) {
output$map <- renderLeaflet({
#plot empty map
empty_map <- leaflet() %>%
addTiles() %>%
setView(lng = 5.583541, lat = 52.577159, zoom = 8)
})
raw_date <- reactive({
raw[raw$date >= input$date[1] & raw$date <= input$date[2],]
raw
})
#other filters
#removing duplicate adresses
reactive({
rawdate <- raw_date()
Name_unq <- rawdate[!duplicated(rawdate$Adres),]
Name_unq <- Adr_tot_unq[order(Adr_tot_unq$Adres),]
#determining information per event
type_ab <- rawdate %>%
group_by(Adres) %>%
summarise(Total = sum(duration), mean = mean(duration)) %>%
ungroup()
#link adresses and location
type_ab <- data.frame(type_ab,Name_unq$Longitude,Name_unq$Latitude)
names(type_ab)[7:8] <- c("Longitude", "Latitude")
#determining which layer to plot
observeEvent({input$a
input$b},
{if(input$a == TRUE & input$b == TRUE) {
lpRemoveAll()
lpAddTotal()
} else if(input$a == FALSE & input$b == FALSE) {
lpRemoveAll()
}
}
)
#define functions and type_ab-layer
lpAddTotal <- function() {
observe(
leafletProxy(mapId = "map", data = type_ab_slider()) %>%
clearMarkerClusters() %>%
addMarkers(clusterOptions = markerClusterOptions(),group = "Total")
)
}
#define function lpRemove
lpRemoveAll <- function() {
leafletProxy(mapId = "map") %>%
clearGroup("Total")
}
#functions to link sliders to layers
type_ab_slider <- reactive({
type_ab[(type_ab$Aantal >= input$events[1] & type_ab$Aantal <= input$events[2]),]
})
shinyApp(ui = ui, server = server)
结束语: 我想使用daterangeInput来对原始数据进行子集化,然后再对该子集进行进一步的过滤。
答案 0 :(得分:0)
尝试:
raw_date <- reactive({
raw <- subset(raw, date >= input$date[1] & date <= input$date[2])
raw
})
和:
reactive({
rawdate<-raw_date()
type_a <- rawdate[type == "a"]
type_a
})
在第二部分中您不需要观察者,reactive可满足您的需求。希望这会有所帮助!