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
library(sf)
## Linking to GEOS 3.13.1, GDAL 3.11.4, PROJ 9.7.0; sf_use_s2() is TRUE
library(tmap)
country <- get_map("country")
division <- get_map("division")
district <- get_map("district")
upazila <- get_map("upazila")
union <- get_map("union")
district <- get_map("district")

transport_hub <- district %>%
  filter(District %in% c("Rangpur", "Sylhet", "Mymensingh"))

transport_hub <- st_transform(transport_hub, crs = 32646)
tm_shape(transport_hub) +
  tm_polygons(fill = "blue") +
  tm_title("Administrative Divisions of Bangladesh") +
  tm_text("District") +
  tm_compass(position = c("left", "bottom"), type = "8star", size = 5) +
  tm_scalebar(position = c("right", "bottom"), text.size = 0.7)+
  tm_grid(lines = TRUE, labels.size = 0.8, col = "gray90")