The folowed map shows the number of deaths in the zone of
Guadalajara, Buga. The data is avaible in
https://www.datos.gov.co/Salud-y-Protecci-n-Social/GEOLOCALIZACI-N-LUGAR-DEFUNCION-2018-2022/55is-nbuz
library(knitr)
library(dplyr)
library(leaflet)
df_raw <- read.csv('../../../datasets/deaths.csv')
df <- df_raw %>%
rename(lat = latitud, lng = longitud) %>%
select(c("lng", "lat")) %>%
filter(!is.na(lat)) %>%
filter(!is.na(lng))
df %>%
leaflet() %>%
addTiles() %>%
addMarkers(clusterOptions = markerClusterOptions())