Data


msi_by_program <- read_csv("msi-computing-by-program.csv")
glimpse(msi_by_program)
## Rows: 174
## Columns: 19
## $ inst_name       <chr> "Alabama A & M University", "Alabama A & M University"…
## $ ope_id          <dbl> 100200, 100200, 239600, 354100, 206200, 114400, 398030…
## $ state_id        <chr> "AL", "AL", "MS", "TX", "MD", "CA", "CA", "CA", "CA", …
## $ housed_under    <chr> "Computing", "Computing", "Computing", "Computing", "C…
## $ college         <chr> "College of Engineering, Technology, and Physical Scie…
## $ college_id      <chr> "eng-tech-phys-sci", "eng-tech-phys-sci", "na", "na", …
## $ school          <chr> "N/A", "N/A", "School of Arts & Sciences", "N/A", "N/A…
## $ school_id       <chr> "na", "na", "art-sci", "na", "na", "na", "na", "na", "…
## $ department      <chr> "Department of Engineering & Computer Science", "Depar…
## $ dept_id         <chr> "cs-eng", "cs-eng", "cs-math", "cs", "cs", "cs", "na",…
## $ program_area    <chr> "Computer Science", "Computer Science", "Computer and …
## $ area_id         <chr> "cs", "cs", "comp-info-sys", "cs", "cs", "cs", "cs", "…
## $ program_level   <chr> "Master of Science", "Master of Science Online", "Mast…
## $ level_id        <chr> "ms", "ms-online", "ms", "ms", "ms", "ms", "ms", "ms",…
## $ cip_id          <chr> "11.0701", "11.0701", "11.0199", "11.0701", "11.0701",…
## $ website_inst    <chr> "https://www.aamu.edu/", "https://www.aamu.edu/", "htt…
## $ website_program <chr> "https://www.aamu.edu/academics/graduate-studies/maste…
## $ website_catalog <chr> "https://www.aamu.edu/academics/catalogs/_documents/gr…
## $ course_titles   <chr> "Design & Analysis of Algorithms; Object Oriented Prog…
msi_by_course <-
  msi_by_program %>%
  mutate(course_titles = str_split(course_titles, "; ")) %>%
  unnest(course_titles)
glimpse(msi_by_course)
## Rows: 5,779
## Columns: 19
## $ inst_name       <chr> "Alabama A & M University", "Alabama A & M University"…
## $ ope_id          <dbl> 100200, 100200, 100200, 100200, 100200, 100200, 100200…
## $ state_id        <chr> "AL", "AL", "AL", "AL", "AL", "AL", "AL", "AL", "AL", …
## $ housed_under    <chr> "Computing", "Computing", "Computing", "Computing", "C…
## $ college         <chr> "College of Engineering, Technology, and Physical Scie…
## $ college_id      <chr> "eng-tech-phys-sci", "eng-tech-phys-sci", "eng-tech-ph…
## $ school          <chr> "N/A", "N/A", "N/A", "N/A", "N/A", "N/A", "N/A", "N/A"…
## $ school_id       <chr> "na", "na", "na", "na", "na", "na", "na", "na", "na", …
## $ department      <chr> "Department of Engineering & Computer Science", "Depar…
## $ dept_id         <chr> "cs-eng", "cs-eng", "cs-eng", "cs-eng", "cs-eng", "cs-…
## $ program_area    <chr> "Computer Science", "Computer Science", "Computer Scie…
## $ area_id         <chr> "cs", "cs", "cs", "cs", "cs", "cs", "cs", "cs", "cs", …
## $ program_level   <chr> "Master of Science", "Master of Science", "Master of S…
## $ level_id        <chr> "ms", "ms", "ms", "ms", "ms", "ms", "ms", "ms", "ms", …
## $ cip_id          <chr> "11.0701", "11.0701", "11.0701", "11.0701", "11.0701",…
## $ website_inst    <chr> "https://www.aamu.edu/", "https://www.aamu.edu/", "htt…
## $ website_program <chr> "https://www.aamu.edu/academics/graduate-studies/maste…
## $ website_catalog <chr> "https://www.aamu.edu/academics/catalogs/_documents/gr…
## $ course_titles   <chr> "Design & Analysis of Algorithms", "Object Oriented Pr…
write_csv(msi_by_course, "msi-computing-by-course.csv")

Analysis


msi_by_course <- read_csv("msi-computing-by-course.csv")
msi_by_course %>% count(course_titles, sort = TRUE) %>% head(20)
## # A tibble: 20 × 2
##    course_titles                         n
##    <chr>                             <int>
##  1 Artificial Intelligence              53
##  2 Advanced Operating Systems           38
##  3 Data Mining                          37
##  4 Machine Learning                     36
##  5 Software Engineering                 36
##  6 Computer Graphics                    35
##  7 Advanced Computer Architecture       34
##  8 Database Management Systems          34
##  9 Computer Networks                    31
## 10 Analysis of Algorithms               28
## 11 Computer Vision                      28
## 12 Cloud Computing                      26
## 13 Thesis                               26
## 14 Independent Study                    24
## 15 Design and Analysis of Algorithms    23
## 16 Operating Systems                    23
## 17 Computer Architecture                22
## 18 Network Security                     22
## 19 Computer Security                    21
## 20 Human-Computer Interaction           21
##        term    n
## 1       and 1194
## 2  computer  726
## 3   systems  663
## 4  advanced  608
## 5        in  578
## 6        of  505
## 7      data  456
## 8  security  385
## 9    topics  352
## 10 software  333

Terms by Total Count

## # A tibble: 10 × 2
##    term        count
##    <chr>       <dbl>
##  1 computer      727
##  2 systems       668
##  3 advanced      608
##  4 data          461
##  5 security      392
##  6 topics        353
##  7 software      336
##  8 information   305
##  9 design        287
## 10 engineering   258

Terms by Program Count

## # A tibble: 10 × 2
##    term        count
##    <chr>       <int>
##  1 systems       149
##  2 computer      142
##  3 security      134
##  4 data          131
##  5 advanced      127
##  6 analysis      119
##  7 database      114
##  8 computing     114
##  9 software      112
## 10 information   108