R Markdown

This is an R Markdown document. Markdown is a simple formatting syntax for authoring HTML, PDF, and MS Word documents. For more details on using R Markdown see http://rmarkdown.rstudio.com.

When you click the Knit button a document will be generated that includes both content as well as the output of any embedded R code chunks within the document. You can embed an R code chunk like this:

summary(cars)
##      speed           dist       
##  Min.   : 4.0   Min.   :  2.00  
##  1st Qu.:12.0   1st Qu.: 26.00  
##  Median :15.0   Median : 36.00  
##  Mean   :15.4   Mean   : 42.98  
##  3rd Qu.:19.0   3rd Qu.: 56.00  
##  Max.   :25.0   Max.   :120.00

Including Plots

You can also embed plots, for example:

Note that the echo = FALSE parameter was added to the code chunk to prevent printing of the R code that generated the plot.

db4

Groups of diamond filters

DB Extra

# https://shiny.posit.co/blog/posts/bslib-dashboards/#card-level-sidebars

library(bslib)
library(htmltools)
library(crosstalk)
library(plotly)
library(leaflet)

# Create Diamonds view
dat <- SharedData$new(dplyr::sample_n(diamonds, 1000))

sidebar_diamonds <- layout_sidebar(
  sidebar = filter_select("cut", "Cut", dat, ~cut),
  plot_ly(dat) |> add_histogram(x = ~price)
)

# Create Earthquake view
squake <- SharedData$new(quakes)

sidebar_quakes <- layout_sidebar(
  class = "p-0",
  sidebar = sidebar(
    title = "Earthquakes off Fiji",
    bg = "#1E1E1E",
    class = "fw-bold font-monospace",
    position = "right",
    filter_slider("mag", "Magnitude", squake, ~mag, ticks = FALSE)
  ),
  leaflet(squake) |> addTiles() |> addCircleMarkers()
) |>
  tagAppendAttributes(style = css("--bs-card-border-color" = "#1E1E1E"))



page_fillable(
  card(
    full_screen = TRUE,
    card_header("Diamonds"),
    sidebar_diamonds
  ),
  card(
    full_screen = TRUE,
    card_header("Earthquakes"),
    sidebar_quakes
  )
)
Diamonds
Earthquakes