library(bangladesh)
country <- get_map("country")
division <- get_map("division")
district <- get_map("district")
upazila <- get_map("upazila")
union <- get_map("union")
plot(country[1], col = "darkgreen", border = "red", main = "Map of Bangladesh")
plot(division[1])
# District Map
plot(district[1],
col = adjustcolor("green", alpha.f = 0.4),
border = "darkgreen",
main = "Districts Map of Bangladesh")
plot(upazila[1],
col = terrain.colors(length(upazila)),
border = "black",
lwd = 1.0,
main = "Upazila Map")
## Warning in plot.sf(upazila[1], col = terrain.colors(length(upazila)), border =
## "black", : col is not of length 1 or nrow(x): colors will be recycled; use pal
## to specify a color palette
plot(union[1],
col = colorRampPalette(c("darkgreen", "yellow", "red"))(length(union)),
border = "black",
lwd = 0.15,
main = "Union Map of Bangladesh")
## Warning in plot.sf(union[1], col = colorRampPalette(c("darkgreen", "yellow", :
## col is not of length 1 or nrow(x): colors will be recycled; use pal to specify
## a color palette