Mangrove Research in the Philippines

📊 Number of Mangrove Studies Over Time

library(plotly)
Loading required package: ggplot2

Attaching package: 'plotly'
The following object is masked from 'package:ggplot2':

    last_plot
The following object is masked from 'package:stats':

    filter
The following object is masked from 'package:graphics':

    layout
# Simulated data
years <- 2000:2024
studies <- sample(5:30, length(years), replace = TRUE)

df <- data.frame(Year = years, Studies = studies)

plot_ly(df, x = ~Year, y = ~Studies, type = 'scatter', mode = 'lines+markers') %>%
  layout(title = "Number of Mangrove Studies (2000–2024)",
         xaxis = list(title = "Year"),
         yaxis = list(title = "Number of Studies"))

👩‍🔬 Top Mangrove Scientists in the Philippines

library(DT)

# Example data
scientists <- data.frame(
  Name = c("Dr. Jurgenne Primavera", "Dr. Rex Cruz", "Dr. Gil Jacinto", "Dr. Rene Rollon"),
  Affiliation = c("Zoological Society of London", "UP Los Baños", "UP MSI", "UP Diliman"),
  Number_of_Publications = c(45, 33, 28, 25)
)

datatable(scientists, options = list(pageLength = 5), rownames = FALSE)

🗺️ Map of Mangrove Study Locations in the Philippines

library(leaflet)

# Example data
locations <- data.frame(
  Study = c("Palawan Study", "Leyte Study", "Davao Study"),
  Lat = c(9.8, 10.8, 7.1),
  Lon = c(118.7, 124.8, 125.6)
)

leaflet(locations) %>%
  addTiles() %>%
  addMarkers(~Lon, ~Lat, popup = ~Study) %>%
  addProviderTiles(providers$Esri.WorldImagery)