shp <- file.path(getOption("default.datadir"),
"data/listdata.thelist.tas.gov.au/opendata/data/list_authority_land_hobart.shp")
d <- sf::read_sf(shp)
library(ggplot2) ## devtools::install_github("")
ggplot(d) + geom_sf()

## smash the metadata (doesn't work)
##ggplot(sf::st_set_crs(d, NA)) + geom_sf()
## go rogue
tab <- ggplot2::fortify(as(d, "Spatial"))
## Regions defined for each Polygons
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
ggplot(tab %>% rename(easting = long, northing = lat),
aes(easting, northing, group = group, fill = id)) +
geom_polygon() + coord_equal() + guides(fill = FALSE)

## ggfortify::geom_polypath will handle holes and *standard* aesthetics of group/id
## be clear that geom_sf is respecting the projection, it's just that
## graticule longlat looks rectangly up close
data("wrld_simpl", package = "maptools")
w <- sp::spTransform(subset(wrld_simpl, NAME == "Australia"),
sf::st_crs(d)$proj4string)
ggplot(sf::st_as_sf(w)) + geom_sf() + ggtitle(sf::st_crs(d)$proj4string)
