knitr::opts_chunk$set(cache = TRUE)

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(highcharter)
## Registered S3 method overwritten by 'quantmod':
##   method            from
##   as.zoo.data.frame zoo
library(viridisLite)
library(ggplot2)
library(crosstalk)
data(unemployment)
data(uscountygeojson)


thm <- 
  hc_theme(
    chart = list(
      backgroundColor = "transparent",
      style = list(fontFamily = "Source Sans Pro")
    ),
    xAxis = list(
      gridLineWidth = 1
    )
  )

data("USArrests", package = "datasets")
data("usgeojson")

USArrests <- USArrests %>%
  mutate(state = rownames(.))

#n <- 4
#colstops <- data.frame(
 # q = 0:n/n,
#  c = substring(viridis(n + 1), 0, 7)) %>%
 # list.parse2()

GIS Dashboard Example

Column

ggplot2 Plots

## `geom_smooth()` using method = 'loess' and formula = 'y ~ x'

Column

htmlwidgets

Iris Flower Dataset

tables

Page 1

Column

Dashboard design - percentage of organic vs. conventional avacado sales in different regions

## Warning: Can only have one: highlight
## Warning: Specifying width/height in layout() is now deprecated.
## Please specify in ggplotly() or plot_ly()