R Markdown

library(ggplot2)
 
project_data <- read.csv('https://raw.githubusercontent.com/Kingtilon1/DATA608/main/project_data.csv')

status_colors <- c("Complete" = "#2ca02c", "In Progress" = "#ff7f0e", "Not Started" = "#1f77b4")

scorecard_plot <- ggplot(project_data, aes(x = Task, y = Priority, fill = Status)) +
  geom_bar(stat = "identity", width = 0.6) +
  scale_fill_manual(values = status_colors) +
  labs(title = "Project Score Card",
       x = "Task",
       y = "Priority",
       fill = "Status") +
  theme_minimal() +
  theme(legend.position = "bottom",
        axis.text.x = element_text(angle = 45, hjust = 1),
        plot.title = element_text(hjust = 0.5))

scorecard_plot

burn_data <- data.frame(
  Day = 1:10,
  Planned = c(50, 45, 40, 35, 30, 25, 20, 15, 10, 5),
  Actual = c(50, 42, 38, 32, 28, 22, 18, 12, 8, 3)
)

burn_down_plot <- ggplot(burn_data, aes(x = Day)) +
  geom_line(aes(y = Planned, color = "Planned"), linetype = "dashed") +
  geom_line(aes(y = Actual, color = "Actual")) +
  scale_color_manual(values = c("Planned" = "#1f77b4", "Actual" = "#ff7f0e")) +
  labs(title = "Burn Down Chart",
       x = "Day",
       y = "Tasks Remaining") +
  theme_minimal() +
  theme(legend.title = element_blank(),
        plot.title = element_text(hjust = 0.5))

print(burn_down_plot)