Trying to make a road map for a coffee n fashion lifestyle brand i am musing on here is the road map for it.

and here for an agrosphere start-up i am musing on.

# Load libraries
library(ggplot2)
library(dplyr)

# Define the project phases and activities
project_data <- data.frame(
  phase = c("Planning & Research", "Planning & Research", "Planning & Research", 
            "Platform Development", "Platform Development", "Platform Development", 
            "Partner Engagement", "Partner Engagement",
            "Pilot Launch & Feedback", "Pilot Launch & Feedback", "Pilot Launch & Feedback",
            "Full-Scale Rollout", "Full-Scale Rollout",
            "Continuous Improvement", "Continuous Improvement", "Continuous Improvement"),
  activity = c("Market Research", "Needs Assessment", "Partner Identification",
               "Design & Development", "Feature Integration", "User Testing",
               "Relationship Building", "Training Programs",
               "Regional Pilot Launch", "Feedback Collection", "Platform Adjustments",
               "Broader Platform Availability", "Marketing Campaigns",
               "Performance Monitoring", "New Partnerships", "Feature Enhancements"),
  start_date = as.Date(c("2024-01-01", "2024-01-01", "2024-01-01", 
                         "2024-04-01", "2024-04-01", "2024-04-01", 
                         "2024-07-01", "2024-07-01",
                         "2024-10-01", "2024-10-01", "2024-10-01",
                         "2025-01-01", "2025-01-01",
                         "2025-07-01", "2025-07-01", "2025-07-01")),
  end_date = as.Date(c("2024-03-31", "2024-03-31", "2024-03-31", 
                       "2024-06-30", "2024-06-30", "2024-06-30", 
                       "2024-09-30", "2024-09-30",
                       "2024-12-31", "2024-12-31", "2024-12-31",
                       "2025-06-30", "2025-06-30",
                       "2025-12-31", "2025-12-31", "2025-12-31"))
)

# Plot the Gantt chart
ggplot(project_data, aes(x = start_date, xend = end_date, y = activity, yend = activity, color = phase)) +
  geom_segment(size = 6) +
  scale_x_date(date_breaks = "1 month", date_labels = "%b %Y") +
  theme_minimal() +
  theme(axis.text.y = element_text(size = 10, face = "bold"),
        axis.text.x = element_text(angle = 45, hjust = 1),
        plot.title = element_text(size = 14, face = "bold")) +
  labs(title = "Elim's AgroSphere Product Map",
       x = "Timeline",
       y = "Activities",
       color = "Phase") +
  theme(legend.position = "bottom")
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.

gantt_plot