MSQM Program Progress






December 06, 2025

We are 18.2 % of the way through our MSQM program!

Additional summary statistics will not be so interesting. Still, here they are.

##     Course             Complete     
##  Length:22          Min.   :0.0000  
##  Class :character   1st Qu.:0.0000  
##  Mode  :character   Median :0.0000  
##                     Mean   :0.1818  
##                     3rd Qu.:0.0000  
##                     Max.   :1.0000













Detail

Here is my code:

setwd("~/Desktop/mydata")
library(readr)
library(dplyr)
library(flexdashboard)
library(htmltools)
#upload csv. I made this dataset by copy / pasting the course list from the msqm website and manually updating the complete column.
courses <- read_csv("msqm_courses.csv")
#set up logic
completed <- sum(courses$Complete == 1, na.rm=TRUE)
total_courses <- nrow(courses)
remaining <- total_courses - completed






December 06, 2025

#summary statistic

div(
  style = "text-align: center;",
  paste("We are ", round(mean(courses$Complete, na.rm = TRUE) * 100, 1), "% of the way through our MSQM program!")
)
We are 18.2 % of the way through our MSQM program!
div(
  style = "display: flex; justify-content: center;",
  flexdashboard::gauge(
    completed,
    min = 0,
    max = total_courses,
    sectors = flexdashboard::gaugeSectors(
      success = c(0, total_courses), color = "purple"
    ),
    label = paste(completed, "/", total_courses, "Completed")
  )
)

Additional summary statistics will not be so interesting. Still, here they are.

summary(courses)
##     Course             Complete     
##  Length:22          Min.   :0.0000  
##  Class :character   1st Qu.:0.0000  
##  Mode  :character   Median :0.0000  
##                     Mean   :0.1818  
##                     3rd Qu.:0.0000  
##                     Max.   :1.0000