Library
library(bangladesh)
Data
country <- get_map("country")
division <- get_map("division")
district <- get_map("district")
upazila <- get_map("upazila")
union <- get_map("union")
Plot
plot(country[1], col = "lightblue", border = "black")

plot(division[1], col = rainbow(8), main = "Bangladesh Divisions")

plot(upazila[1], col = heat.colors(5), main = "Bangladesh Upazilas")
## Warning in plot.sf(upazila[1], col = heat.colors(5), main = "Bangladesh
## Upazilas"): col is not of length 1 or nrow(x): colors will be recycled; use pal
## to specify a color palette

plot(union[1], col = terrain.colors(10), main = "Bangladesh Unions")
## Warning in plot.sf(union[1], col = terrain.colors(10), main = "Bangladesh
## Unions"): col is not of length 1 or nrow(x): colors will be recycled; use pal
## to specify a color palette

Deploy R
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
Subset for Ramna and Jatrabari
subset_upazila <- upazila %>%
filter(Upazila %in% c("Ramna", "Jatrabari"))
plot(subset_upazila[1])
