Data Montgomery: https://data.montgomerycountymd.gov/Education/Tuition-Assistance/p7z5-tjrz
This dataset includes a list of classes approved and paid through the County tuition assistance program. Update Frequency: Twice a Year
The dataset consist of around 3,870 rows and 7 columns.
library(tidyverse)
## -- Attaching packages --------------------------------------- tidyverse 1.3.1 --
## v ggplot2 3.3.5 v purrr 0.3.4
## v tibble 3.1.5 v dplyr 1.0.7
## v tidyr 1.1.4 v stringr 1.4.0
## v readr 2.0.2 v forcats 0.5.1
## Warning: package 'ggplot2' was built under R version 4.1.2
## Warning: package 'tidyr' was built under R version 4.1.2
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag() masks stats::lag()
library(ggplot2)
library("knitr")
library(dplyr)
# Setting working directory
setwd("C:/Users/Jerem/OneDrive/Documents")
# Provide a fast and friendly way to read rectangular data
library(readr)
# rereading dataset into bees
Tuition <- read_csv("Montgomery College/Spring 2022/DATA 205/Datasets/Tuition_Assistance.csv")
## Rows: 3870 Columns: 7
## -- Column specification --------------------------------------------------------
## Delimiter: ","
## chr (6): Department, Major, Degree, School, Course Title, Course Description
##
## i Use `spec()` to retrieve the full column specification for this data.
## i Specify the column types or set `show_col_types = FALSE` to quiet this message.
#View(Tuition)
str(Tuition)
## spec_tbl_df [3,870 x 7] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
## $ Department :
## Warning: One or more parsing issues, see `problems()` for details
## chr [1:3870] "Police" "Police" "Police" "Health & Human Services" ...
## $ Major : chr [1:3870] "Business/Admin./Mgmt." "Business/Admin./Mgmt." "Business/Admin./Mgmt." "Business/Admin./Mgmt." ...
## $ Degree : chr [1:3870] "AA" "AA" "AA" "Masters (MA/MS/MPH/etc.)" ...
## $ School : chr [1:3870] "Montgomery College Rockville Campus" "Montgomery College Rockville Campus" "Montgomery College Rockville Campus" "BOWIE STATE UNIVERSITY" ...
## $ Course Title : chr [1:3870] "INTRODUCTION TO BUSINESS" "MA 160" "INTRO TO AMERICAN MUSIC" "PUBLIC POLICY ANALYSIS" ...
## $ Course Description: chr [1:3870] "An introductory course designed to survey the field of business and its environment in order to give the studen"| __truncated__ "A general calculus course primarily for business students. Topics include algebraic, exponential, and logarithm"| __truncated__ "A survey of American popular music from the turn of the 20th century to the present with an emphasis on rock music." "Focus is on the analysis of costs and benefits in the selection of the public policy choices. Students analyze "| __truncated__ ...
## $ Cost : num [1:3870] 392 392 392 1062 1569 ...
## - attr(*, "spec")=
## .. cols(
## .. Department = col_character(),
## .. Major = col_character(),
## .. Degree = col_character(),
## .. School = col_character(),
## .. `Course Title` = col_character(),
## .. `Course Description` = col_character(),
## .. Cost = col_number()
## .. )
## - attr(*, "problems")=<externalptr>
Data is too complex and would interfere with the exporation. Therefore removed from the dataset.
# Removing variables from the dataset
Tuition$`Course Description` = NULL
There are 341 unique values in the School column.
unique(Tuition$School)
## [1] "Montgomery College Rockville Campus"
## [2] "BOWIE STATE UNIVERSITY"
## [3] "Mount St Mary's University"
## [4] "University of Maryland - University College"
## [5] "PRINCE GEORGE'S COMMUNITY COLLEGE"
## [6] "University of Maryland - Baltimore"
## [7] "NATIONAL ASSOCIATION OF HOUSING AND REDEVELOPMENT OFFICIALS"
## [8] "FREDERICK COMMUNITY COLLEGE"
## [9] "University of Maryland - College Park"
## [10] "GEORGE WASHINGTON UNIVERSITY"
## [11] "George Washington University"
## [12] "MONTGOMERY COMMUNITY COLLEGE"
## [13] "Weber State University"
## [14] "CAPELLA UNIVERSITY"
## [15] "STRAYER UNIVERSITY"
## [16] "HOWARD UNIVERSITY"
## [17] "Waldorf College"
## [18] "American College of Physicians (ACP)"
## [19] "ARGOSY UNIVERSITY"
## [20] "UNIVERSITY OF DC"
## [21] "COLUMBIA SOUTHERN UNIVERSITY"
## [22] "CAPITOL COLLEGE"
## [23] "UNIVERSITY OF BALTIMORE"
## [24] "Robert Morris University"
## [25] "UNIVERSITY OF PHOENIX"
## [26] "American Public University System"
## [27] "GLOCK PROFESSIONAL, INC"
## [28] "HOOD COLLEGE"
## [29] "BOSTON UNIVERSITY"
## [30] "MONTGOMERY COUNTY COMMUNITY COLLEGE"
## [31] "UNIVERSITY OF FLORIDA"
## [32] "PENN FOSTER COLLEGE"
## [33] "University of Maryland - Baltimore County"
## [34] "School of PE"
## [35] "MORGAN STATE UNIVERSITY"
## [36] "WALDEN UNIVERSITY"
## [37] "JOHNS HOPKINS UNIVERSITY"
## [38] "SALISBURY UNIVERSITY"
## [39] "MD SHRM State Council"
## [40] "UNIVERSITY OF MARYLAND, UNIVERSITY COLLEGE"
## [41] "GEORGE MASON UNIVERSITY"
## [42] "Villanova University"
## [43] "MD SHRM STATE COUNCIL"
## [44] "CHAMBERLAIN COLLEGE OF NURSING"
## [45] "COMMUNITY COLLEGE OF BALTIMORE COUNTY"
## [46] "NORTHERN VIRGINIA COMMUNITY COLLEGE"
## [47] "Shemer Bar Review, LLC."
## [48] "COLUMBIA UNION COLLEGE"
## [49] "UNIVERSITY OF MARYLAND AT SHADY GROVE CENTER"
## [50] "Arizona State University"
## [51] "MONTGOMERY COUNTY COLLEGE"
## [52] "Harrisburg Area Community College - Harrisburg"
## [53] "Wilmington University"
## [54] "Shippensburg University of Pennsylvania"
## [55] "Breastfeeding Outlook"
## [56] "Human Resources Institute"
## [57] "NIGP: The Institute for Public Procurement"
## [58] "OFFICE OF EDUCATION AND TRAINING FOR ADDICTION SERVICES"
## [59] "Sistema Universitario Ana G Mendez - Universidad Del Turabo"
## [60] "Environmental Systems Research Institute (ESRI)"
## [61] "BENEDICTINE UNIVERSITY"
## [62] "UNIVERSITY OF MARYLAND, COLLEGE PARK"
## [63] "ACADEMI"
## [64] "HOWARD COMMUNITY COLLEGE"
## [65] "Purdue University"
## [66] "COLT DEFENSE LLC"
## [67] "GEORGETOWN UNIVERSITY"
## [68] "SIGNET NORTH AMERICA"
## [69] "PESI ---CONTINUING EDUCATIOIN SEMINARS"
## [70] "Remote Medical International"
## [71] "BERLITZ LANGUAGE CENTER"
## [72] "AMERICAN MILITARY UNIVERSITY"
## [73] "The Newberry Group, Inc"
## [74] "INTERNATIONAL ASSOCIATION OF COMPUTER INVESTIGATIVE SPECIALIST"
## [75] "JOHN E. REID AND ASSOCIATES, INC."
## [76] "PENNSYLVANIA STATE UNIVERSITY"
## [77] "HAGERSTOWN COMMUNITY COLLEGE"
## [78] "BELLEVUE UNIVERSITY"
## [79] "BALTIMORE CITY COMMUNITY COLLEGE"
## [80] "VEHICLE DYNAMICS INSTITUTE (VDI)"
## [81] "PUBLIC AGENCY TRAINING COUNCIL"
## [82] "PAT MCCARTHY PRODUCTIONS, INC"
## [83] "GEORGIA K9 NTC, LLC"
## [84] "Loyola College in Maryland"
## [85] "LIBERTY UNIVERSITY"
## [86] "TOWSON UNIVERSITY"
## [87] "ASHWORTH COLLEGE"
## [88] "Kaplan University"
## [89] "MCKISSOCK, LP"
## [90] "MARYLAND FIRE AND RESCUE INSTITUTE"
## [91] "ASHFORD UNIVERSITY"
## [92] "Kennesaw State University"
## [93] "THE CENTER FOR ALTERNATIVE DISPUTE RESOLUTION"
## [94] "MONTOGMERY COLLEGE"
## [95] "Appraisal Institute"
## [96] "Johns Hopkins University"
## [97] "The SANS (SysAdmin, Audit, Network, Security) INSTITUTE"
## [98] "BORRA CPA REVIEW"
## [99] "FROSTBURG STATE UNIVERSITY"
## [100] "Essex County College"
## [101] "Pennsylvania State University - Penn State Main Campus"
## [102] "ROPES THAT RESCUE LTD."
## [103] "GALLAUDET UNIVERSITY"
## [104] "UNIVERSITY OF NEW ENGLAND"
## [105] "CORNELL UNIVERSITY"
## [106] "Career Academy Inc"
## [107] "SHRM TRAINING FOR PHR AND SPHR CERTIFICATION"
## [108] "ASSOCIATION OF CERTIFIED FRAUD EXAMINERS"
## [109] "Princeton University"
## [110] "Maryland Association of Public Accountants"
## [111] "Montessori Western Teacher Training Program"
## [112] "Berlitz Language Centers"
## [113] "Fox Valley Technical College"
## [114] "COLLEGE OF SOUTHERN MARYLAND"
## [115] "Colorado Technical University"
## [116] "WIDENER UNIVERSITY SCHOOL OF LAW"
## [117] "BUCKS COUNTY COMMUNITY COLLEGE"
## [118] "CAPE COD INSTITUTE"
## [119] "BAIR Analytics Inc"
## [120] "CONTEMPORARY FORUMS"
## [121] "Virginia Task Force 2"
## [122] "Learning Tree, Inc."
## [123] "SKILLPATH SEMINARS"
## [124] "Indiana University"
## [125] "K9 GUARDIAN, INC."
## [126] "Rescue 3 International, Inc."
## [127] "HEALTHY CHILDREN PROJECT, INC"
## [128] "Nova Southeastern University"
## [129] "F.A.J.Exams"
## [130] "GOVERNMENT FINANCE OFFICERS ASSOCIATION"
## [131] "Pace Institute"
## [132] "New York Medical College"
## [133] "Institute of Electrical and Electronics Engineers (IEEE)"
## [134] "REDBACK ONE, LLC"
## [135] "EMDR INSTITUTE, INC"
## [136] "Loyola University Maryland"
## [137] "STORM MOUNTAIN TRAINING CENTER"
## [138] "Themis Bar Review"
## [139] "CATHOLIC UNIVERSITY OF AMERICA"
## [140] "COLLISION SAFETY INSTITUTE (CSI)"
## [141] "Norwich University"
## [142] "SUNY Empire State College"
## [143] "INTERNATIONAL ASSOCIATION OF ARSON INVESTIGATORS"
## [144] "ASIS INTERNATIONAL"
## [145] "Beck Institute"
## [146] "Regis University"
## [147] "Cambridge Nursing Assistant Academy"
## [148] "Rasmussen College"
## [149] "National Fire Protection Association"
## [150] "Association for Talent Development (ATD)"
## [151] "PESI HEALTHCARE LLC"
## [152] "International Association of Forensic Nurses"
## [153] "Institute for Natural Resources (INR)"
## [154] "AMERICAN PUBLIC UNIVERSITY"
## [155] "Independent Electrical Contractors Chesapeake"
## [156] "University of Richmond"
## [157] "FIRE DEPARTMENT TRAINING NETWORK"
## [158] "ANNE ARUNDEL COMMUNITY COLLEGE"
## [159] "Trauma and Critical Care Foundation"
## [160] "Project Management Institute (PMI)"
## [161] "GRADUATE SCHOOL, USDA"
## [162] "Society for Human Resource Management"
## [163] "Howard Community College"
## [164] "LEADERSHIP MONTGOMERY"
## [165] "University of Chicago"
## [166] "B D ASSOCIATES, INC."
## [167] "UNIVERSITY OF MARYLAND"
## [168] "Associated Center for Therapy"
## [169] "Lactation Education Resources"
## [170] "ALICE Training Institute"
## [171] "National Criminal Enforcement Association"
## [172] "Eastern Kentucky University"
## [173] "The Center for Forensic Science and Research Education"
## [174] "Tripwire Operations Group"
## [175] "Montgomery Community College"
## [176] "HITS, Inc"
## [177] "HARLEY-DAVIDSON RIDERS EDGE"
## [178] "Marshall University"
## [179] "HealthSciences Institute"
## [180] "American Institute of CPAs"
## [181] "American Institute of Certified Public Accountants"
## [182] "The University of Alabama"
## [183] "American Association of Diabetes Educators"
## [184] "BLUE RIDGE COMMUNITY AND TECHNICAL COLLEGE"
## [185] "Our Lady of the Lake University"
## [186] "Indiana University of Pennsylvania"
## [187] "University of South Alabama"
## [188] "American Payroll Association"
## [189] "GLOCK INC."
## [190] "YORK COLLEGE OF PENNSYLVANIA"
## [191] "COPPIN STATE UNIVERSITY"
## [192] "SIMPLILEARN SOLUTIONS"
## [193] "INTERNATIONAL ASSOCIATION OF FIRE CHIEFS"
## [194] "GRAND CANYON UNIVERSITY"
## [195] "California Polytechnic State University-San Luis Obispo"
## [196] "Ace Tech Institute"
## [197] "Johnson Controls"
## [198] "Kaplan Test Prep"
## [199] "M.S. Electrical Training, LLC"
## [200] "Kennedy Krieger Institute"
## [201] "ITT Technical Institute - Indianapolis"
## [202] "HARVARD ASSOCIATES IN POLICE SCIENCE, INC."
## [203] "CALIBRE PRESS"
## [204] "International School of Languages (ISL)"
## [205] "M.S. Electrical Training LLC"
## [206] "MARYLAND POLICE AND CORRECTIONAL TRAINING COMMISSIONS (MPCTC"
## [207] "Remington Arms Company, LLC"
## [208] "ICA Language Services"
## [209] "Desert Snow, LLC"
## [210] "MANAGEMENT CONCEPTS"
## [211] "LA HIDTA HOMICIDE SCHOOL"
## [212] "Professional Education Services, LP"
## [213] "Southern New Hampshire University"
## [214] "M.J. Francoeur & Associates Dale Carnegie Training"
## [215] "FORT HAYS STATE UNIVERSITY"
## [216] "Green Ops"
## [217] "Indiana Institute of Technology"
## [218] "West Texas A & M University"
## [219] "Frostburg State University"
## [220] "Washington Adventist University"
## [221] "Cellebrite Inc"
## [222] "Stevenson University"
## [223] "MID-ATLANTIC REGIONAL GANG INVESTIGATOS NETWORK"
## [224] "Chicago School of Professional Psychology"
## [225] "National Institute of Governmental Purchasing"
## [226] "TRILOGY HSE"
## [227] "BECKER PROFESSIONAL EDUCATION"
## [228] "Cypress Creek EMS"
## [229] "Alliance Francaise DC"
## [230] "Seton Hall University"
## [231] "American Society of Pension Professionals and Actuaries (ASPPA)"
## [232] "Vyne Education"
## [233] "International Association of Undercover Officers"
## [234] "Art Institute of Cincinnati"
## [235] "Cheetah Learning"
## [236] "National Business Institute"
## [237] "CE You!"
## [238] "Concordia University"
## [239] "Oregon State University"
## [240] "Embry-Riddle Aeronautical University - Daytona Beach"
## [241] "Kaplan Institute"
## [242] "Sage Dynamics, LLC"
## [243] "New Horizons Career Center"
## [244] "McAfee Institute"
## [245] "West Virginia University"
## [246] "Psychwire"
## [247] "Kaplan Schweser"
## [248] "Mid Atlantic OSHA Training Institute Education Center"
## [249] "Evangel University"
## [250] "Carroll Community College"
## [251] "Morning Star Academy (MSA), School of Allied Health"
## [252] "University of Pennsylvania"
## [253] "Marymount University"
## [254] "California Coast University"
## [255] "Rochester Institute of Technology"
## [256] "UTICA COLLEGE"
## [257] "Starbright Training Institute"
## [258] "Georgetown University"
## [259] "RUTGERS UNIVERSITY - NEWARK - SCHOOL OF PUBLIC AFFAIRS AND ADMINISTRATION"
## [260] "Institutional Limited Partners Association (ILPA)"
## [261] "Frederick Community College"
## [262] "Presentation College"
## [263] "LABOR ARBITRATION INSTITUTE"
## [264] "Guerilla Approach"
## [265] "University of the Cumberlands"
## [266] "REGENT UNIVERSITY"
## [267] "BOMI International"
## [268] "RedVector Convergence Training"
## [269] "K-9 Cop Magazine"
## [270] "American Health Information Management Association"
## [271] "Interior Designers Institute"
## [272] "Brown University"
## [273] "Ferentz Institute"
## [274] "Trauma Institute & Child Trauma Institute"
## [275] "ASA Institute of Business and Computer Technology"
## [276] "Anne Arundel Community College"
## [277] "Stratford University"
## [278] "Adelphi University"
## [279] "Notre Dame University of Maryland"
## [280] "University of Cincinnati - Main Campus"
## [281] "Clemson University"
## [282] "JOHN JAY COLLEGE"
## [283] "Hale Products"
## [284] "Public Pension Financial Forum"
## [285] "EMDR OF GREATER WASHINGTON"
## [286] "Howard College"
## [287] "PSYCHOTHERAPY NETWORKER SYMPOSIUM"
## [288] "BSR FIREARMS TRAINING CENTER"
## [289] "Indiana University Bloomington"
## [290] "American Physician Institute"
## [291] "Colorado State University"
## [292] "Mid Atlantic Chapter of the Association for Contextual Behavioral Sciences (MACACBS)"
## [293] "New York Institute of Art and Design"
## [294] "Maryland State Bar Association"
## [295] "First Airway, LLC"
## [296] "Indian River Community College"
## [297] "Old Dominion University"
## [298] "American Association of Diabetes Educators (AADE)"
## [299] "Colorado State University: Global Campus"
## [300] "PROJECT MANAGEMENT INSTITUTE"
## [301] "New York University"
## [302] "UNIVERSITY OF THE DISTRICT OF COLUMBIA"
## [303] "Harvard Medical School, Massachusetts Mental Health Center"
## [304] "American Sentinel University - Aurora"
## [305] "Duke University"
## [306] "Kent State University"
## [307] "VARSITY TUTORS"
## [308] "University of Vermont"
## [309] "CALIFORNIA UNIVERSITY OF PENNSYLVANIA"
## [310] "INPUT-ACE"
## [311] "University of Maryland Global Campus"
## [312] "Montreat College"
## [313] "American University"
## [314] "Introduction Today, Inc."
## [315] "UNIVERSITY OF MARYLAND AT BALTIMORE"
## [316] "Force Science Institute, LTD."
## [317] "Modern Samura Project"
## [318] "Central Michigan University"
## [319] "Institute of Police Technology & Management"
## [320] "STREET COP TRAINING"
## [321] "Daigle Law Group, LLC"
## [322] "University of Maryland Medical System"
## [323] "Triton Training Group"
## [324] "Centrifuge Training, LLC"
## [325] "Sons of Liberty Gun Works"
## [326] "SHIPPENSBURG UNIVERSITY"
## [327] "HR Certification"
## [328] "Academy of Art University"
## [329] "American College of Medical Toxicology"
## [330] "International Association of Financial Crimes Investigators"
## [331] "NATIONAL WHITE COLLAR CRIME CENTER"
## [332] "Special Operations Medical Association (SOMA)"
## [333] "Harvard University"
## [334] "Drexel University"
## [335] "Mount St. Mary's College"
## [336] "Expertise School of"
## [337] "Johnson & Wales University"
## [338] "AMERICAN CRIME PREVENTION INSTITUTE (ACPI)"
## [339] "MGH Psychiatry Academy"
## [340] "LWRC International"
## [341] "Concordia University, St. Paul"
Due to the time limit and cleaning, this exploration is going to focus on one unique value. Since DATA 205 is a Montgomery College course, data is focus on Montgomery College.
# Subsetting variable
MC_Tuition <- subset(Tuition, Tuition$School == "Montgomery College Rockville Campus")
MC_Tuition %>% head() %>% knitr::kable()
| Department | Major | Degree | School | Course Title | Cost |
|---|---|---|---|---|---|
| Police | Business/Admin./Mgmt. | AA | Montgomery College Rockville Campus | INTRODUCTION TO BUSINESS | 392 |
| Police | Business/Admin./Mgmt. | AA | Montgomery College Rockville Campus | MA 160 | 392 |
| Police | Business/Admin./Mgmt. | AA | Montgomery College Rockville Campus | INTRO TO AMERICAN MUSIC | 392 |
| Police | Business/Admin./Mgmt. | AA | Montgomery College Rockville Campus | ACCOUNTING 202 | 392 |
| Transportation | Agricultural General | Other | Montgomery College Rockville Campus | CONSTRUCT PLAN READING L | 0 |
| Health & Human Services | Business/Admin./Mgmt. | AA | Montgomery College Rockville Campus | INTRODUCTION TO BUSINESS | 336 |
The new dataframe consist of 215 rows and 6 columns.
# Barplot of MC Departments
ggplot(MC_Tuition, aes(x = Department, y = Cost, fill = Department)) +
geom_bar(stat = 'identity') +
coord_flip() +
theme(legend.position = "none") +
labs(title = "Tuition Towards MC Departments",
x = "Departments",
y = "Cost (USD)")
The department of General Service has the highest tuition.
# Barplot of MC Majors
ggplot(MC_Tuition, aes(x = Major, y = Cost, fill = Major)) +
geom_bar(stat = 'identity') +
coord_flip() +
theme(legend.position = "none") +
labs(title = "Tuition Towards each Major",
x = "Major",
y = "Cost (USD)")
Business/Admin./Mgmt. majors are the most likey to earn a higher tuition according to the data. But this can also mean that majority of the school body is Business/Admin./Mgmt. majors.
# Barplot of MC Degree
ggplot(MC_Tuition, aes(x = Degree, y = Cost, fill = Degree)) +
geom_bar(stat = 'identity') +
theme(legend.position = "none") +
labs(title = "Tuition Towards MC Degree",
x = "Degree",
y = "Cost (USD)")
Majority of the tuition is towards an Assoicates degree. This is because Montgomery College’s academic program usually prepare students to earn an associates degree so they can transfer to a four year college.