Load example data: FluxDataKit.
library(dplyr)
library(ggplot2)
library(sf)
library(rnaturalearth)
library(FluxDataKit)
Show sites on a map
coast <- rnaturalearth::ne_coastline(
scale = 110,
returnclass = "sf"
)
FluxDataKit::fdk_site_info |>
ggplot() +
geom_hex(
aes(x = lon, y = lat),
bins = c(75, 60)
) +
geom_sf(
data = coast,
colour = 'black',
linewidth = 0.3
) +
coord_sf(
ylim = c(-60, 85),
expand = FALSE
) +
scale_fill_viridis_c(
option = "magma"
)