传单上的 Flexdashboard 和绝对面板

Flexdashboard and absolute panel on a lealfet

有没有办法将此示例 (https://shiny.rstudio.com/gallery/superzip-example.html) 中的绝对面板包含到 flexdashboard(在传单上)? 这个想法是有一个专用于传单输出的移动面板而不是侧边栏面板。

此处的绝对面板示例基于闪亮的示例(带有 ui 和服务器部分)

library(shiny)

ui <- shinyUI(bootstrapPage(
  absolutePanel(
    id = "controls", class = "panel panel-default", fixed = TRUE,
    draggable = TRUE, top = 60, left = "auto", right = 20, bottom = "auto",
    width = 330, height = "auto",
    HTML('<button data-toggle="collapse" data-target="#demo">Collapsible</button>'),
    tags$div(id = 'demo',
             checkboxInput('input_draw_point', 'Draw point', FALSE ),
             verbatimTextOutput('summary')))
))

server <- shinyServer(function(input, output, session) {
  output$summary <- renderPrint(print(cars))

})

shinyApp(ui = ui, server = server)

下面是 Flexdashboard 部分的代码示例:

---
title: "Waste Lands - America's forgotten nuclear legacy"
author: Philipp Ottolinger
output: 
  flexdashboard::flex_dashboard:
    theme: journal
    social: menu
    source_code: embed
---

```{r setup, include = FALSE}
library(flexdashboard)
library(shiny)
library(jsonlite)
library(maptools)
library(ggplot2)
library(tidyr)
library(dplyr)
library(purrr)
library(leaflet)
library(plotly)

sites <- fromJSON(flatten=TRUE,
  "https://raw.githubusercontent.com/ottlngr/2016-15/ottlngr/ottlngr/sites.json")

sites$locations <- map(sites$locations, function(x) {
  if (nrow(x) == 0) {
    data_frame(latitude=NA, longitude=NA, postal_code=NA, name=NA, street_address=NA)
  } else {
    x
  }
})

sites <- unnest(sites)
sites <- sites[complete.cases(sites[,c("longitude", "latitude")]),]

sites$ratingcol <- ifelse(sites$site.rating == 0, "orange",
                          ifelse(sites$site.rating == 1, "green",
                                 ifelse(sites$site.rating == 2, "red", "black")))

sites$ratingf <- factor(sites$site.rating,
                        levels=c(3:0),
                        labels=c("Remote or no potential for radioactive contamination.",
                                 "No authority to clean up or status unclear.",
                                 "Cleanup declared complete.",
                                 "Cleanup in progress."))

sites$campus <- ifelse(grepl("University", sites$site.name) | 
                       grepl("University", pattern = sites$street_address) | 
                       grepl("Campus", sites$street_address), 1, 0)
sites$campuscol <- ifelse(sites$campus == 1, "red", "black")
```

Column {data-width=650}
-----------------------------------------------------------------------

### All sites and their current status

```{r}
leaflet() %>% 
  addTiles() %>% 
  fitBounds(-127.44,24.05,-65.30,50.35) %>% 
  addCircleMarkers(sites$longitude, 
                   sites$latitude, 
                   color = sites$ratingcol, 
                   radius = 6, 
                   fill = T,
                   fillOpacity = 0.2,
                   opacity = 0.6,
                   popup = paste(sites$site.city,
                                 sites$site.name, 
                                 sep = "")) %>%
  addLegend("bottomleft", 
            colors = c("orange","green", "red", "black"),
            labels = c("Cleanup in progress.",
                       "Cleanup complete.",
                       "Status unclear.",
                       "No potential for radioactive contamination."), 
            opacity = 0.8)
```

Column {data-width=350}
-----------------------------------------------------------------------

### Number of sites

```{r}
sites %>% 
  count(ratingf) %>%
  plot_ly(type = "bar", 
          x = ratingf, 
          y = n, 
          color = ratingf, 
          text = paste(n,ratingf,sep=""), 
          hoverinfo = "text") %>%
  layout(xaxis = list(showline = F, 
                      showticklabels = F, 
                      fixedrange = T, 
                      title = ""),
         yaxis = list(fixedrange = T, 
                      title = ""))
```

### Sites on campus

```{r}
leaflet() %>% 
  addTiles() %>% 
  fitBounds(-127.44,24.05,-65.30,50.35) %>% 
  addCircleMarkers(sites[sites$campus == 1, ]$longitude, 
                   sites[sites$campus == 1, ]$latitude, 
                   color = sites[sites$campus == 1, ]$campuscol, 
                   radius = 6, 
                   fill = T,
                   fillOpacity = 0.2,
                   opacity = 0.6,
                   popup = paste(sites[sites$campus == 1, ]$site.city,
                                 sites[sites$campus == 1, ]$site.name, 
                                 sep = ""))
```

谢谢

试试这个。

---
title: "haha"
output:
  flexdashboard::flex_dashboard:
    orientation: columns
    vertical_layout: fill
editor_options: 
  chunk_output_type: console
runtime: shiny
---

```{r setup, include=FALSE}
knitr::opts_chunk$set(echo = TRUE)
library(flexdashboard)
library(shiny)
library(leaflet)
```

# without container-fluid

### Sites on campus

```{r}
df <- data.frame(NY = c(-74.418997, 43.257408), CA = c(-120.765285, 35.604380))
renderLeaflet(mapfunction())


```


```{r}

absolutePanel(
        draggable = TRUE, top = "15%", left = "auto", right = "5%", bottom = "auto",
        width = '30%', height = 'auto',
        style = "background: orange; opacity: 0.9",
        p(strong("some text")),
        selectInput("someinput", label = "location", choices = c("NY", "CA"))
    )

```

### server
```{r}
mapfunction <- reactive({
    leaflet() %>% 
    addTiles() %>% 
    fitBounds(-127.44,24.05,-65.30,50.35) %>% 
    addMarkers(lng = df[[input$someinput]][1], lat =  df[[input$someinput]][2])
})
```

# with container-fluid
```{r}
shinyApp(
    fluidPage(
        leafletOutput(outputId = "somemap"),
        absolutePanel(
            draggable = TRUE, top = "15%", left = "auto", right = "5%", bottom = "auto",
            width = '30%', height = 'auto', fixed = TRUE,
            style = "background: orange; opacity: 0.9",
            p(strong("some text")),
            selectInput("someinput", label = "location", choices = c("NY", "CA"))
        )
    ),
    server = function(input, output, session){
        df <- data.frame(NY = c(-74.418997, 43.257408), CA = c(-120.765285, 35.604380))
        output$somemap <- renderLeaflet({
        leaflet() %>% 
            addTiles() %>% 
            fitBounds(-127.44,24.05,-65.30,50.35) %>% 
            addMarkers(lng = df[[input$someinput]][1], lat =  df[[input$someinput]][2])
        })
    }
)

```
  • 如果你需要使用来自shiny的交互组件,比如XXinput,你需要在上面指定runtime: shiny,否则,你可以删除这一行。
  • 我使用reactive 作为最简单的服务器部分。如果您想使用更复杂的服务器(逻辑),例如几个组件一起交互,您需要编写实际的 server 函数。我建议只写一个闪亮的应用程序而不是 flexdashboard。
  • 不幸的是,flexdash 中的组件不在 container-fluid class 中,这样您就可以拖动面板。可能有一种解决方法,您可以搜索它。看看最后一块,我插入了一个真正闪亮的应用程序,面板是可拖动的。 运行 文档时,您应该会看到两个选项卡,注意区别。所以,如果你真的想拖动这个面板,你应该写一个"real"闪亮的应用程序。