Maps

column

Location Map of Study Area

LULC Change Map of Study Area (2017-2021)

Methodology

column

Methodology of LULC Assessment

Description of LULC Classes

LULC Classification Rsults

column

Land Use and Land Cover Changes from 2017-2021

Annual percentage change in land cover classes from 2017-2021

Conclusion

column

🌳 Between 2017 and 2021, the study area experienced notable changes in land use and land cover, with forest land decreasing while water bodies and flooded vegetation remained relatively stable. These patterns, consistent with global and regional observations from remote sensing datasets such as ESRI and USGS, underscore the dynamic nature of land cover changes. Such findings emphasize the critical need for sustainable land management, systematic monitoring, and targeted conservation strategies to maintain ecological integrity, inform environmental planning, and guide evidence-based decision-making.

---
title: "Land Use and Land Cover Change(LULC) Assessment in the Upland Region of Southern-Shan State(2017-2021)"
output: 
  flexdashboard::flex_dashboard:
    orientation: columns
    social: menu
    source_code: embed
    self_contained: true
    vertical_layout: fill
    theme: flatly
    #css: My.style.css
---

```{r setup, include=FALSE}
library(flexdashboard)
library(readxl)
library(dplyr)
library(ggplot2)


# Data Preparation 
my_data <- read_excel("C:/Users/USER/Desktop/My project/LULC data_Taunggyi.xlsx")
head(my_data)
str(my_data)

my_data <- read_excel("C:/Users/USER/Desktop/My project/LULC data_Taunggyi.xlsx", sheet = "LULC changes")
head(my_data)

my_data <- read_excel("C:/Users/USER/Desktop/My project/LULC data_Taunggyi.xlsx", sheet = "Annual change")
head(my_data)

```

# Sidebar {.sidebar}

### 🗺️ Study Area Overview

📍 Taunggyi Township, Taunggyi District, Southern part of Shan State.

📍4,573 feet (1,394 m) above sea level. Latitude of 20° 47' 1.0752'' N, the longitude of 97° 2' 7.3032'' E.

📍Humid subtropical highland Climate.

📍Subtropical moist mountainous forest type.

📍Moist upper mixed deciduous forest, dry upper mixed deciduous forest, Evergreen forest, dry hill forest, pine forest.

📍Agriculture is the largest economic sector.

📍Logging, expanding agriculture and plantations, increasing forest degradation, and urban areas threaten to cause LULC changes.

------------------------------------------------------------------------

# Maps

## column

### Location Map of Study Area

![](C:/Users/USER/Desktop/My%20project/Location%20map%20of%20taunggyi.jpg){width="350%"}

### LULC Change Map of Study Area (2017-2021)

![](C:/Users/USER/Desktop/My%20project/Land%20cover%20classfication%20map.jpg){width="350%"}

# Methodology

## column

### Methodology of LULC Assessment

![](C:/Users/USER/Desktop/My project/Methodology.jpg){width="350%"}

### Description of LULC Classes

![](C:/Users/USER/Desktop/My project/LULC Classes.jpg){width="350%"}

# LULC Classification Rsults

## column

### Land Use and Land Cover Changes from 2017-2021

```{r, echo=FALSE}
my_data <- read_excel("C:/Users/USER/Desktop/My project/LULC data_Taunggyi.xlsx", sheet = "LULC changes")

ggplot(my_data, aes(x = LULC_Type, y = Surface_Area_ha, fill = factor(Year))) +
  geom_bar(stat = "identity", position = "dodge", color = "black") +
  scale_fill_manual(values = c("2017" = "darkorange", "2021" = "darkgreen")) +
  labs(
    x = "LULC Classes",
    y = "Surface Area (ha)",
    fill = "Year"
  ) +
  theme_minimal() +
  theme(
    axis.text.x = element_text(angle = 45, hjust = 1),
    plot.title = element_text(hjust = 0.5, size = 16, face = "bold"),
  )

```

### Annual percentage change in land cover classes from 2017-2021

```{r, echo=FALSE}
my_data <- read_excel("C:/Users/USER/Desktop/My project/LULC data_Taunggyi.xlsx", sheet = "Annual change")

ggplot(my_data,aes(x = LULC_Types, y = Annual_Rate_2017_2021, fill = Remark)) +
  geom_bar(stat = "identity", color = "black") +
  scale_fill_manual(values = c("Increased" = "#37FBF2", "Decreased" = "#E74BC2")) +
  labs(
    x = "LULC Classes",
    y = "Annual Rate of Change (%)",
    fill = "Change"
  ) +
  theme_minimal() +
  theme(
    axis.text.x = element_text(angle = 45, hjust = 1),
    plot.title = element_text(hjust = 0.5, size = 16, face = "bold"),
  )
```

# Conclusion

## column

###  

🌳 Between 2017 and 2021, the study area experienced notable changes in land use and land cover, with forest land decreasing while water bodies and flooded vegetation remained relatively stable. These patterns, consistent with global and regional observations from remote sensing datasets such as ESRI and USGS, underscore the dynamic nature of land cover changes. Such findings emphasize the critical need for sustainable land management, systematic monitoring, and targeted conservation strategies to maintain ecological integrity, inform environmental planning, and guide evidence-based decision-making.