Khol Hi Raitan (Morni Hills) Wildlife Sanctuary

protected areas siwaliks morni hills khol hi raitan wildlife sanctuary

A short description and introduction to Khol Hi Raitan Wildlife Sanctuary.

Abhishek Kumar https://akumar.netlify.app/ (Panjab University, Chandigarh)https://puchd.ac.in/
08-27-2021
Show code
#library(bfast)       # change detection algorithms
#library(lubridate)   # handling date object
#library(osmdata)     # spatial data extraction
library(raster)      # raster data
#library(rgee)        # Google Earth Engine in R
library(sf)          # spatial data handling
library(tidyverse)   # general data wrangling and visualisation
library(tmap)        # thematic mapping 

#knitr::write_bib(x = c(.packages(), "distill"), "packages.bib")

Abstract

Introduction

Various developmental activities and requirements of local people have brought significant ecological changes and degradation in the Siwalik Hills of the Inter State Chandigarh Region.

Siwalik landscape has been identified as one of the most degraded ecosystems of India primarily due to its fragile soil resulting in heavy soil erosion. Weathering and erosion in this area has produced a variety of erosional land-form features. The seasonal streams commonly called choes run from NE to SW descend into the valleys. On an average more than 50% of the total rain in the Siwalik ends in run-off. At foothills, artificial Sukhna lake was constructed in 1958 for water storage, however, it is facing siltation problem due to erosion and sedimentation from Siwalik hills (Y. Singh 2002). The Chandigarh Siwalik hills and Morni hills are separated by the Ghaggar river (Y. Singh 2001). Tikkar taal is a natural lake at the site and known to support several diatoms (Saini, Khanagwal, and Singh 2017). Water from natural resources have been reported to contain varying amount of Uranium and Radon indicating their presence in the rocks in the area (Joga Singh et al. 2008b, 2008a, 2009). The soils also have varying degree of Uranium, Radium and Radon (Pundir, Rajinder, and Sunil 2014; Joga Singh et al. 2008b).

Notification and declaration

An area of 2,226.58 ha was initially notified as R-70 Khol Hi-Raitan (KHR) Wildlife Sanctuary on 10 December 2004 with Gazette notification No. S.O. 269/C.A. 53/1972/S. 26-A/2004 by Forest Department of Government of Haryana. Later, the forest area was identified to cover a total of 2,656.38 ha and declared as wildlife sanctuary on 07 September 2007 with gazette notification No. S.O. 71/C.A. 53/1972/S.26/2007.

The eco-sensitive zone (ESZ) around KHR was proposed as area within five kilometres of the boundary on 03 June 2009 with notification No. S.O. 1394 (E).

Show code
knitr::include_graphics("data/mwls-map-2009.jpg")
Ecosensitive Zone (ESZ) of Khol Hi-Raital wildlife sanctuary as drafted in September 2009. Figure from [Haryana Forest Department](https://cdnbbsr.s3waas.gov.in/s3c5866e93cab1776890fe343c9e7063fb/uploads/2021/05/2021052022-1.jpg)

Figure 1: Ecosensitive Zone (ESZ) of Khol Hi-Raital wildlife sanctuary as drafted in September 2009. Figure from Haryana Forest Department

However, the proposal has been revised in another draft No. S.O. 1395 (E) dated 21 May 2015 and the ESZ has been revised to vary from zero to 925 meters only.

Show code

knitr::include_graphics("data/mwls-map-2016.jpg")
Ecosensitive Zone (ESZ) of Khol Hi-Raital wildlife sanctuary as drafted in May 2015. Figure from [MoEFCC, Govt. of India](https://moef.gov.in/wp-content/uploads/2019/10/Map-of-ESZ-of-Khol-Hi-Ratan-WLS-Haryana.pdf)

Figure 2: Ecosensitive Zone (ESZ) of Khol Hi-Raital wildlife sanctuary as drafted in May 2015. Figure from MoEFCC, Govt. of India

Location and Physiography

Show code
## extract boundaries and data from OpenStreetMap
library(osmdata)

## define a bounding box for area of interest
osm_bbox <- c(76.8, 30.6, 77.1, 30.9) # xmin, ymin, xmax, ymax

## extract boundary of the protected area as sf from OpenStreetMap (osm)
protected_areas <- opq(osm_bbox) |>
  add_osm_feature(key = "boundary", value = "protected_area", value_exact = F) |>
  osmdata_sf()

## rename protected areas to short names and save to local file as gpkg
protected_areas$osm_polygons |> select(name, geometry) |>
  mutate(short_name = c("MH", "BS", "SL")) |>
  st_write("data/protected_areas.gpkg")

## extract rivers / streams (waterways) from osm as sf
waterways <- opq(osm_bbox) |> add_osm_feature(key = "waterway") |> 
  osmdata_sf()

## save waterways to local file as gpkg
waterways$osm_lines |> select(name, waterway, geometry) |> 
  st_write("data/waterways.gpkg")

## extract roadways (highway) major roads from osm as sf
highways <- opq(osm_bbox) |> add_osm_feature(key = "highway") |> 
  osmdata_sf()

## save roadways to local file as gpkg
highways$osm_lines |> select(name, highway, geometry) |> 
  st_write("data/highways.gpkg")

## load, merge, and crop pre-downloaded SRTM 30 m elevation data 
elev <- raster("D:/spatial-data/dem/n30_e076_1arc_v3.tif") |>
  merge(raster("D:/spatial-data/dem/n30_e077_1arc_v3.tif")) |> 
  crop(extent(76.85, 77.01, 30.66, 30.75)) # morni hills wls

## prepare and save boundaries for elevation bands
masked_elev <- elev |> mask(mwls)
reclass_matrix <- matrix(data = c(300, 400, 1, 
                                  400, 500, 2, 
                                  500, 600, 3, 
                                  600, 700, 4, 
                                  700, 800, 5), 
                         ncol = 3, byrow = T)
masked_elev |> reclassify(rcl = reclass_matrix) |>
  rasterToPolygons(dissolve = T) |> st_as_sf() |> 
  mutate(elev_zone = c("301-400", "401-500", "501-600", "601-700", "701-800")) |>
  st_write("data/elev_band.gpkg")

## prepare and save hillshade
hillShade(
  # extract slope from elevation
  slope = terrain(elev, opt= "slope"),
  
  # extract aspect from elevation
  aspect = terrain(elev, opt= "aspect"), 
  
  # 45 altitude angle and 315 azimuth angle
  angle = 45, direction = 315) |> 
    writeRaster("data/hill_shade.tif")
Show code
## add hillshade
tm_shape(hill_shade) + 
    tm_raster(palette = "-Greys", n = 100, style = "cont", legend.show = FALSE) +
    
    tm_graticules(lwd = 1.5, col = "grey75", labels.size = 0.85) +  
    
  ## add elevation bands
    tm_shape(elev_band) + tm_fill(col = "elev_zone", alpha = 0.7, palette = "Greens",
                                 title = "Elevation (m)") + 
    
    ## add boundary of protected area
  tm_shape(mwls) + tm_borders(col = "seagreen", lwd = 2.5) +
    
    ## add rivers and streams
  tm_shape(rivers) + tm_lines(col = "#9bbff4", lwd = 6) +
  tm_shape(streams) + tm_lines(col = "#9bbff4", lwd = 3) +
  
  ## add major roads
  tm_shape(tertiary_roads) + tm_lines(col = "white", lwd = 1.5) +
  tm_shape(secondary_roads) + tm_lines(col = "white", lwd = 3) +
  tm_shape(trunk_roads) + tm_lines(col = "white", lwd = 4) +
  
    ## add legend
  tm_add_legend(type = "line", labels = "Roads", col = "white", 
                lwd = 4) +
    tm_add_legend(type = "line", labels = "Rivers", col = "skyblue", lwd = 4) +
    
    
    ## add compass and scale bar
  tm_compass(position = c(0.89, 0.84), size = 2.5, bg.color = "grey90", 
             bg.alpha = 0.7) +
  tm_scale_bar(position = c(0.26, 0.001), breaks = c(0, 5, 10), text.size = 0.75) +
    
    
    ## adjust layout
  tm_layout(frame.double.line = T, compass.type = "arrow", 
            legend.position = c(0.015, 0.015), legend.bg.color = "grey90", 
            legend.bg.alpha = 0.7, 
            main.title = "Khol Hi Raitan (Morni Hills) Wildlife Sanctuary",
            main.title.position = "center",
            legend.text.size = 0.85) 
Location and topography of Khol Hi Raitan Wildlife Sanctuary. The map is prepared in `R` programming environment using the package `tmap` [@tmap2018]

Figure 3: Location and topography of Khol Hi Raitan Wildlife Sanctuary. The map is prepared in R programming environment using the package tmap (tmap2018?)

Show code

## remove all variables from the environment
rm(list = ls())

Biodiversity

The Morni hills are rich in diversity of flora as well as fauna. The site is inhabited by diverse group of non-primates (Chopra, Bhoombak, and Kumar 2013). As many as 156 birds can be observed at lower Siwalik foothills (Chopra and Sharma 2014).

Vegetation

Palynostratigraphical studies of Subathu formation revealed the presence of dinoflagellates cysts, acritarch, fungal spores and ascostroma, pteridophytic spores, and pollen grains of gymnosperms and angiosperms (Sarkar and Prasad 2000). The Siwalik hills probably hosted a luxuriant vegetation in the pre-glacial times in view of rich and varied flora and fauna discovered from wide and distant localities in them. The account of the present-day flora and fauna shows that much has been lost in the last 150 years or more. Vegetation is analysed in three forest types of the site up to a limited extent previously (Rout and Gupta 1989). Several attempts have been made to document the plant diversity of the region (Jain2001?). Orchids are poorly represented and only three orchids (Habenaria plantaginea Lindl., Rhynchostylis retusa Bl. and Zeuxine strateumatica (L.) Schltr.) have been reported from Haryana state (Jain et al. 2000; S. Kumar 2001). Another orchid (Eulophia dabia (D.Don) Hochr.) was later added to the state’s flora (Vij and Verma 2005). Studies have clearly shown that the vegetation of Morni hills is under threat and as many as 61 species have been disappeared since 2000 (S. Singh et al. 2014).

Ecosystem services

Land-use changes (in terms of controlled grazing and increased agriculture), physical structures for water harvesting and vegetation (especially grasses) have significantly reduced erosion and sedimentation. Erosion control combined with land-use changes has resulted in increased the biomass productivities of agriculture, timber and fodder (Scott and Walter 1993). Further, watershed development activities have also contributed the increase in vegetation cover and reduction in soil loss due to high water runoff (O. Singh, Sharma, and Singh 2016). The local inhabitants already know that some plants are more effective in controlling soil erosion. For example, perennial Jhoond grass (Saccharum bengalense) and Bhabbar grass (Eulaliopsis binata) that is thought to be symbiotic with Khair (Acacia catechu), is used to prevent soil erosion (Scott and Walter 1993). Similarly, another plant called Jhingan (Lannea coromandelica) and vegetative barriers of Agave is used as fence for the fields and to stabilize eroding slopes, respectively (Scott and Walter 1993). The utilization various plants as a source of medicine, food, fodder, fibre, gum and dye indicate their socio-economic importance to the local people (J. Singh, Singh, and Laxmi 2017). More than 300 species from the Morni hills only are reported to be of medicinal importance (Balkrishna et al. 2018). Some of Lamiaceous plants possess anti-oxidant properties (S. Singh et al. 2014). Barberry (Berberis aristata DC.) from the hills have been implicated for dyeing the silk (Pruthi, Chawla, and Yadav 2008). Man-made disturbances especially Tourism can potentially threaten the biodiversity and ecological balance. Though tourism may offer economic development, there are also increased chances of habitat degradation and biodiversity loss (Chand 2015). Several trees of the area serve as sleeping site for near threatened Hanuman Langurs (Chopra, Bhoombak, and Kumar 2012).

Soils

The Lower Shivaliks are dominated by alluvial sediments chiefly consisting of loose sand and gravel inserted with clay horizons. Soil is clay loam or silt loam and underlying rocks are soft sandstones that are prone to erosion and result in high water runoff (Rout and Gupta 1990b). The alkali soils of the region are low in organic matter and deficient in nutrients, probably due to minimal leaf litter (R. Kumar et al. 1995).

Climate

The Siwalik Hills experience Koeppen’s Cwg category climate based on annual and monthly means of temperature and rainfall (Koeppen, 1936). The climatic data of Chandigarh suggests that the Chandigarh Siwalik Hills have BSh category climate. For general vegetation there are two major growth periods February to March (Spring) and rainy months of July and August. Leaf fall for non-evergreen vegetation is experienced during October to November (Autumn). Climate is monsoonal, average rainfall of the area is 1069 mm and major portion of the rainfall occurs during June to September. The year is divisible into three seasons, warm wet rainy season (June to September), cool dry winter season (October to March) and hot dry summer season (April to May).

Land Cover

Show code

## data from ESA WorldCover 2020 
mwls_lc <- raster("D:/spatial-data/gee/mwls-ESA_WorldCover_2020.tif")

## a function to convert raster to dataframe
rasterdf <- function(x, aggregate = 1){
    resampleFactor <- aggregate
    inputRaster <- x    
    inCols <- ncol(inputRaster)
    inRows <- nrow(inputRaster)
    
    # Compute numbers of columns and rows in the new raster for mapping
    resampledRaster <- raster(ncol = (inCols / resampleFactor),
                              nrow = (inRows / resampleFactor))
    
    # Match to the extent of the original raster
    extent(resampledRaster) <- extent(inputRaster)
   
    # Resample data on the new raster
    y <- resample(inputRaster, resampledRaster, method='ngb')
   
    # Extract cell coordinates  
    coords <- xyFromCell(y, seq_len(ncell(y)))
    dat <- stack(as.data.frame(getValues(y)))
    
    # Add names - 'value' for data, 'variable' to indicate different raster layers
    # in a stack
    names(dat) <- c('value', 'variable')
    dat <- cbind(coords, dat)
    dat
}

## convert raster to data frame
mwls_df <- rasterdf(mwls_lc)

## prepare legend
LCcodes <- c(seq(10, 90, 10), 95, 100)
LCnames <- c("Trees", "Shrubland", "Grassland", "Cropland", "Built-up", 
             "Barren/Sparse Vegetation", "Snow and Ice", "Open water",
             "Herbaceous wetland", "Mangroves", "Moss and lichen")
LCcolors <- attr(mwls_lc, "legend")@colortable[LCcodes + 1]
names(LCcolors) <- as.character(LCcodes)

## plot the map
ggplot(data = mwls_df) +
  geom_raster(aes(x = x, y = y, fill = as.character(value))) + 
  scale_fill_manual(name = "Land cover",
                    values = LCcolors[-c(7, 9:11)],
                    labels = LCnames[-c(7, 9:11)],
                    na.translate = FALSE) +
  coord_sf(expand = F) +
  theme(axis.title.x = element_blank(),
        axis.title.y = element_blank(),
        panel.background = element_rect(fill = "white", color = "black"))
Land cover at Khol Hi Raitan wildlife sanctuary. Data source: ESA WorldCover 2020

Figure 4: Land cover at Khol Hi Raitan wildlife sanctuary. Data source: ESA WorldCover 2020

Show code

## remove all variables from the environment
#rm(list = ls())
Show code
library(raster)
library(rasterVis)

## data from ESA WorldCover 2020 
mwls_lc <- raster("D:/spatial-data/gee/mwls-ESA_WorldCover_2020.tif")

levels(mwls_lc) <- data.frame(
    ID = c(seq(10, 60, 10), 80),
    landcover = c("Trees", "Shrubland", "Grassland", "Cropland", "Built-up", 
             "Barren/Sparse \n Vegetation", "Open water")
    )

levelplot(mwls_lc, att='landcover',
          col.regions = c("#006400", "#FFBB22", "#FFFF4C", "#F096FF", "#FA0000", 
                          "#B4B4B4", "#0064C8"),
          colorkey = list(height = 1, labels = list(cex = 1.2)))

Ecology

The forest floor litter mass, litter fall, herbaceous biomass and the nutrient content of litter showed significant seasonal variations due to site and tissues in subtropical forest ecosystems of Siwalik hills (Rout and Gupta 1990a). Litter chemical quality controls the rate of leaf-litter decomposition measured as carbon dioxide evolution rates from the soil (Rout and Gupta 1987). Attempts have been made to estimate above ground biomass using Spectral modelling (R. Kumar et al. 2011).

Ecological Problems

Threats

World Herbal Project

Balkrishna, A., A. Srivastava, B. K. Shukla, R. K. Mishra, and B. Joshi. 2018. “Effect of Chemical Composition on Leaf-Litter Decomposition in Forest Soil.” Journal of Non-Timber Forest Products 25 (1): 1–14.
Chand, P. 2015. “Local People’s Perceptions Toward Tourism: A Case Study of Morni Hills (Haryana).” Asia Pacific Journal of Research 1: 70–77. https://citeseerx.ist.psu.edu/viewdoc/download?doi=10.1.1.1061.4492&rep=rep1&type=pdf.
Chopra, G., M. B. Bhoombak, and P. Kumar. 2012. “Selection and Shifting of Sleeping Sites by Hanuman Langurs in Morni Hills of Haryana, India.” Zoo’s Print XXVII: 19--24. http://citeseerx.ist.psu.edu/viewdoc/download?doi=10.1.1.729.2871&rep=rep1&type=pdf.
———. 2013. “Prevalence of Non-Human Primates in Morni Hills of Haryana, India: A Survey.” Tigerpaper 40: 1--9. http://www.fao.org/3/an011e/an011e.pdf.
Chopra, G., and S. K. Sharma. 2014. “Avian Diversity of Lower Shivalik Foothills, India.” International Journal of Research Studies in Biosciences 2: 1--12. https://www.arcjournals.org/pdfs/ijrsb/v2-i7/1.pdf.
Jain, SP, DM Verma, SC Singh, JS Singh, and Sushil Kumar. 2000. “Flora of Haryana,” 113.
Kumar, R., R. L. Ahuja, N. T. Singh, and S. K. Ghabru. 1995. “Characteristics and Classification of Alkali Soils on Siwalik Hills of Satluj-Yamuna Divide, North-West India.” Agropedology 5: 29--35. http://isslup.in/wp-content/uploads/2018/09/Characteristics-and-Classification-of-Alkali-Soils-on-Siwalik-Hills.pdf.
Kumar, R., S. R. Gupta, S. Singh, P. Patil, and V. K. Dhadhwal. 2011. “Spatial Distribution of Forest Biomass Using Remote Sensing and Regression Models in Northern Haryana, India.” International Journal of Ecology and Environmental Sciences 37 (1): 37–47. https://nieindia.org/Journal/index.php/ijees/article/view/14/0.
Kumar, Shrawan. 2001. Flora of Haryana (Materials). Dehradun: Bishen Singh Mahendra Pal Singh.
Pruthi, N., G. D. Chawla, and S. Yadav. 2008. “Dyeing of Silk with Barberry Bark Dye Using Mordant Combination.” Natural Product Radiance 7: 40--44. http://nopr.niscair.res.in/handle/123456789/5643.
Pundir, A., S. Rajinder, and K. Sunil. 2014. “Measurement of Radon Concentration and Exhalation Rates in Soil Samples of Some Districts of Haryana and Himachal in India.” Researcher 6: 71--76. https://doi.org/10.7537/marsrsj060614.14.
Rout, S. K., and S. R. Gupta. 1987. “Effect of Chemical Composition on Leaf-Litter Decomposition in Forest Soil.” Proceedings / Indian Academy of Sciences 97 (5): 399–404. https://doi.org/10.1007/bf03053566.
———. 1989. “Analysis of Forest Vegetation of Morni Hills in Northeast Haryana.” Proceedings / Indian Academy of Sciences 99 (2): 117–26. https://doi.org/10.1007/bf03053523.
———. 1990a. “Forest Floor, Litterfall and Nutrient Return in Subtropical Forest Ecosystems of Siwaliks in Northern India. I. Forest Floor Litter and Herbaceous Biomass.” Flora 184 (5): 325–39. https://doi.org/10.1016/s0367-2530(17)31631-6.
———. 1990b. “Forest Floor, Litterfall and Nutrient Return in Subtropical Forest Ecosystems of Siwaliks in Northern India II. Litterfall Pattern and Nutrient Turnover Rates.” Flora 184 (6): 405–21. https://doi.org/10.1016/s0367-2530(17)31643-2.
Saini, Ekta, V. P. Khanagwal, and Rajvinder Singh. 2017. “A Systematic Databasing of Diatoms from Different Geographical Localities and Sites of Haryana for Advancing Validation of Forensic Diatomology.” Data in Brief 10 (February): 63–68. https://doi.org/10.1016/j.dib.2016.11.072.
Sarkar, S., and V. Prasad. 2000. “Palynostratigraphy and Depositional Environment of the Subathu Formation (Late Ypresian-Middle Lutetian), Morni Hills, Haryana, India.” Journal of the Palaeontological Society of India 45: 137--149. http://www.palaeontologicalsociety.in/vol45/v9.pdf.
Scott, Christopher Anand, and Michael F. Walter. 1993. “Local Knowledge and Conventional Soil Science Approaches to Erosional Processes in the Shivalik Himalaya.” Mountain Research and Development 13 (1): 61–72. https://doi.org/10.2307/3673644.
Singh, J., A. Singh, and V. Laxmi. 2017. “Appraisal of Non-Timber Forest Products in Morni and Raipur Rani Ranges of Shivalik Hills, India.” International Journal of Forest Usufructs Management 18: 2--13.
Singh, Joga, Harmanjit Singh, Surinder Singh, and B. S. Bajwa. 2008a. “Estimation of Uranium and Radon Concentration in Some Drinking Water Samples.” Radiation Measurements 43: S523–26. https://doi.org/10.1016/j.radmeas.2008.04.004.
———. 2008b. “Estimation of Uranium and Radon Concentration in Some Drinking Water Samples of Upper Siwaliks, India.” Environmental Monitoring and Assessment 154 (1-4): 15–22. https://doi.org/10.1007/s10661-008-0373-8.
———. 2009. “Uranium, Radium and Radon Exhalation Studies in Some Soil Samples Using Plastic Track Detectors.” Indian Journal of Physics 83 (8): 1147–53. https://doi.org/10.1007/s12648-009-0094-z.
Singh, Omvir, Tejpal Sharma, and Jagdeep Singh. 2016. “Farmers’ Perceptions and Satisfaction Levels on the Performance of Watershed Development Activities in the Morni Hill Area of the Siwalik Himalayas in India.” Human Ecology 44 (1): 91–104. https://doi.org/10.1007/s10745-015-9801-x.
Singh, S., D. R. Batish, R. K. Kohli, and H. P. Singh. 2014. “An Evaluation of the Antioxidant Properties of Some Oil Yielding Lamiaceous Plants from Morni Hills (Haryana, India ).” International Journal of Pharmacognosy 1: 640--645. https://doi.org/10.13040/IJPSR.0975-8232.IJP.1(10).640-45.
Singh, Y. 2001. “Geo-Ecology of the Trans Satluj Punjab - Haryana Siwalik Hills, NW India.” ENVIS Bulletin: Himalayan Ecology and Development 9: 19--38. http://gbpihedenvis.nic.in/ENVIS%20Bullitin/Vol.%209/vol9_2.PDF.
———. 2002. “Siltation Problems in Sukhna Lake in Chandigarh, NW India and Comments on Geohydrological Changes in the Yamuna-Satluj Region.” ENVIS Bulletin: Himalayan Ecology and Development 10: 18--31. http://www.indiaenvironmentportal.org.in/files/sukhna%20lake.pdf.
Vij, S. P., and J. Verma. 2005. “Eulophia Dabia (d.don) Hochr.: A New Orchid Record for Haryana State, India.” Journal of the Orchid Society of India 19: 47--49.

References

Corrections

If you see mistakes or want to suggest changes, please create an issue on the source repository.

Reuse

Text and figures are licensed under Creative Commons Attribution CC BY 4.0. Source code is available at https://github.com/abhikumar86/abhikumar86.github.io/, unless otherwise noted. The figures that have been reused from other sources don't fall under this license and can be recognized by a note in their caption: "Figure from ...".

Citation

For attribution, please cite this work as

Kumar (2021, Aug. 27). Abhishek Kumar: Khol Hi Raitan (Morni Hills) Wildlife Sanctuary. Retrieved from https://abhikumar86.github.io/posts/2021-08-27-mwls/

BibTeX citation

@misc{kumar2021khol,
  author = {Kumar, Abhishek},
  title = {Abhishek Kumar: Khol Hi Raitan (Morni Hills) Wildlife Sanctuary},
  url = {https://abhikumar86.github.io/posts/2021-08-27-mwls/},
  year = {2021}
}