Library

library(bangladesh)

Data

country <- get_map("country")
division <- get_map("division")
district <- get_map("district")
upazila <- get_map("upazila")

Bangladesh

country <- get_map("country")
plot(country[1],col="red",border="darkgreen")

Division(My version)

division <- get_map("division")
plot(division[1],col=heat.colors(7))
## Warning in plot.sf(division[1], col = heat.colors(7)): col is not of length 1
## or nrow(x): colors will be recycled; use pal to specify a color palette

My Division

library(bangladesh)
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
# Create subset for Dhaka
 subset_division <- division %>%
  filter(Division %in% c("Dhaka"))

plot(subset_division[1],col="purple",main="My Division Dhaka")

District(My version)

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

My District (Barisal)

library(dplyr)
library(bangladesh)
library(dplyr)



 # Create subset for Barisal
 subset_district <- district %>%
  filter(District %in% c("Barisal"))

plot(subset_district[1],col="yellow",border="blue",main="My District Barisal")

Upazila

upazila <- get_map("upazila")
plot(upazila[1],col=colors<-terrain.colors(7))
## Warning in plot.sf(upazila[1], col = colors <- terrain.colors(7)): col is not
## of length 1 or nrow(x): colors will be recycled; use pal to specify a color
## palette

Data Transform Library

library(dplyr)

#Select Muladi and Dhanmondi and Jatrabari

# Create subset for Muladi and Dhanmondi and Jatrabari
subset_upazila <- upazila %>%
  filter(Upazila %in% c("Muladi","Dhanmondi","Jatrabari"))

plot(subset_upazila[1])