Today I’m exploring a dataset and trying to get it into a more usable format. This post is a prequel to a video/talk for the R4Ds Online Learning Community, in which I turn the data I explore in this post into a simple data package (and explain why and how to do that).
Packages
Whenever I use a function from a package in this post, I call out the package explicitly with package::function syntax. Still, it’s friendly to let you know what you should install to play along. We’ll mostly use dplyr, but there are a couple calls to map functions from purrr, and we’ll use tidyr::fill to make some things easier to use. We’ll use readr and readxl to get the data into our session, and we’ll use stringr once or twice to clean up some text. We’ll use DT::datatable to make the tables a bit more browsable. We’ll also use rlang for some tidy evaluation (specifically !! and :=). If you aren’t familiar with tidy evaluation, this video by Hadley Wickham is an excellent introduction.
library(dplyr)
library(DT)
library(purrr)
library(readr)
library(readxl)
library(rlang)
library(stringr)
library(tidyr)
The Data
The College Scorecard is freely available from the US government (licensed under Creative Commons CCZero, meaning it is fully public domain). I’ve downloaded the full raw data locally and unzipped it. We’re going to focus our exploration on the most recent data (2015-2016).
college_scorecard_2015_2016 <- readr::read_csv(
"CollegeScorecard_Raw_Data/MERGED2015_16_PP.csv",
na = c("", "NA", "NULL")
)
The data includes 1805 observations (aka columns or features) about colleges and universities in the United States (7593 institutions as of 2015-2016). However, the column names can be fairly opaque (for example, “HCM2” means “under_investigation” or “heightened cash monitoring 2”, where “The Department places institutions on a Heightened Cash Monitoring (HCM) payment method to provide additional oversight of cash management. HCM2 is the type of HCM that indicates more serious financial or federal compliance issues. These data are maintained by FSA.”)
To make the data more useful, let’s rename the columns, make sure they’re typed as expected, and translate encoded values into more meaningful values. To help us out, we’ll use the data dictionary. I’ve downloaded it locally so we don’t have to deal with parsing data from the web for this project.
The Data Dictionary
The provided data dictionary is a pretty good guide to making the data more useful.
data_dictionary <- readxl::read_xlsx(
"CollegeScorecardDataDictionary.xlsx",
sheet = "data_dictionary"
)
DT::datatable(head(data_dictionary), options = list(pageLength = 3))
NAME OF DATA ELEMENT | dev-category | developer-friendly name | API data type | VARIABLE NAME | VALUE | LABEL | SOURCE | NOTES |
---|
NAME OF DATA ELEMENT | dev-category | developer-friendly name | API data type | VARIABLE NAME | VALUE | LABEL | SOURCE | NOTES | |
---|---|---|---|---|---|---|---|---|---|
1 | Unit ID for institution | root | id | integer | UNITID | IPEDS | Shown/used on consumer website. | ||
2 | 8-digit OPE ID for institution | root | ope8_id | integer | OPEID | IPEDS | Shown/used on consumer website. | ||
3 | 6-digit OPE ID for institution | root | ope6_id | integer | OPEID6 | IPEDS | Shown/used on consumer website. |
From a quick glance through the dictionary, we can see that two columns are mostly empty: VALUE and LABEL. These columns describe sub-dictionaries for certain columns, where a given value in that column has an expanded meaning. We’ll come back to those in a bit, and use them to build a couple more tibbles of data.
The columns that are most immediately useful to us, though, are “developer-friendly name”, “API data type”, and “VARIABLE NAME”. Let’s use those to clean up the data.
column_definitions <- data_dictionary %>%
dplyr::select(
ugly_column_name = `VARIABLE NAME`,
better_column_name = `developer-friendly name`,
data_type = `API data type`
) %>%
dplyr::filter(ugly_column_name != "")
DT::datatable(head(column_definitions))
Applying the Dictionary
Right away, we can see that the “data_type” column is going to need some translation (what is an “autocomplete” data type?), but it should get us closer. We’ll use this information to walk through the given data, fixing the columns. Note that the dictionary has 4 “VARIABLE NAMEs” that have lowercase characters, but the column names are all uppercase. There are also 9 columns that aren’t defined in this part of the data dictionary, so we’ll ignore those columns for now; I’ll be happy to have the other 1796 columns cleaned. While we’re at it, we’ll remove any columns that don’t vary; there are historical columns sticking around in the dataset that do not currently have any information, so let’s get rid of those.
column_definitions <- column_definitions %>%
dplyr::mutate(ugly_column_name = stringr::str_to_upper(ugly_column_name)) %>%
dplyr::filter(ugly_column_name %in% colnames(college_scorecard_2015_2016)) %>%
dplyr::mutate(data_type = dplyr::recode(
data_type,
integer = "integer",
autocomplete = "character",
string = "character",
float = "double"
))
defined_columns <- dplyr::intersect(
colnames(college_scorecard_2015_2016),
column_definitions$ugly_column_name
)
latest_college_scorecard <- purrr::map_dfc(defined_columns, function(this_column) {
this_column_contents <- college_scorecard_2015_2016[[this_column]]
# If this column has no variability, let's get rid of it.
this_column_variability <- unique(this_column_contents)
if(length(this_column_variability) == 1) {
NULL
} else {
definition <- column_definitions %>%
dplyr::filter(ugly_column_name == this_column)
data_type <- definition$data_type[[1]]
suppressWarnings(class(this_column_contents) <- data_type)
better_name <- definition$better_column_name[[1]]
dplyr::tibble(
!! better_name := this_column_contents
)
}
})
DT::datatable(head(latest_college_scorecard, 3))
id | ope8_id | ope6_id | name | city | state | zip | accreditor | school_url | price_calculator_url | under_investigation | main_campus | branches | degrees_awarded.predominant | degrees_awarded.highest | ownership | state_fips | region_id | locale | location.lat | location.lon | carnegie_basic | carnegie_undergrad | carnegie_size_setting | minority_serving.historically_black | minority_serving.predominantly_black | minority_serving.annh | minority_serving.tribal | minority_serving.aanipi | minority_serving.hispanic | minority_serving.nant | men_only | women_only | religious_affiliation | admission_rate.overall | admission_rate.by_ope_id | sat_scores.25th_percentile.critical_reading | sat_scores.75th_percentile.critical_reading | sat_scores.25th_percentile.math | sat_scores.75th_percentile.math | sat_scores.25th_percentile.writing | sat_scores.75th_percentile.writing | sat_scores.midpoint.critical_reading | sat_scores.midpoint.math | sat_scores.midpoint.writing | act_scores.25th_percentile.cumulative | act_scores.75th_percentile.cumulative | act_scores.25th_percentile.english | act_scores.75th_percentile.english | act_scores.25th_percentile.math | act_scores.75th_percentile.math | act_scores.25th_percentile.writing | act_scores.75th_percentile.writing | act_scores.midpoint.cumulative | act_scores.midpoint.english | act_scores.midpoint.math | act_scores.midpoint.writing | sat_scores.average.overall | sat_scores.average.by_ope_id | program_percentage.agriculture | program_percentage.resources | program_percentage.architecture | program_percentage.ethnic_cultural_gender | program_percentage.communication | program_percentage.communications_technology | program_percentage.computer | program_percentage.personal_culinary | program_percentage.education | program_percentage.engineering | program_percentage.engineering_technology | program_percentage.language | program_percentage.family_consumer_science | program_percentage.legal | program_percentage.english | program_percentage.humanities | program_percentage.library | program_percentage.biological | program_percentage.mathematics | program_percentage.military | program_percentage.multidiscipline | program_percentage.parks_recreation_fitness | program_percentage.philosophy_religious | program_percentage.theology_religious_vocation | program_percentage.physical_science | program_percentage.science_technology | program_percentage.psychology | program_percentage.security_law_enforcement | program_percentage.public_administration_social_service | program_percentage.social_science | program_percentage.construction | program_percentage.mechanic_repair_technology | program_percentage.precision_production | program_percentage.transportation | program_percentage.visual_performing | program_percentage.health | program_percentage.business_marketing | program_percentage.history | program.certificate_lt_1_yr.agriculture | program.certificate_lt_2_yr.agriculture | program.assoc.agriculture | program.certificate_lt_4_yr.agriculture | program.bachelors.agriculture | program.certificate_lt_1_yr.resources | program.certificate_lt_2_yr.resources | program.assoc.resources | program.certificate_lt_4_yr.resources | program.bachelors.resources | program.certificate_lt_1_yr.architecture | program.certificate_lt_2_yr.architecture | program.assoc.architecture | program.certificate_lt_4_yr.architecture | program.bachelors.architecture | program.certificate_lt_1_yr.ethnic_cultural_gender | program.certificate_lt_2_yr.ethnic_cultural_gender | program.assoc.ethnic_cultural_gender | program.certificate_lt_4_yr.ethnic_cultural_gender | program.bachelors.ethnic_cultural_gender | program.certificate_lt_1_yr.communication | program.certificate_lt_2_yr.communication | program.assoc.communication | program.certificate_lt_4_yr.communication | program.bachelors.communication | program.certificate_lt_1_yr.communications_technology | program.certificate_lt_2_yr.communications_technology | program.assoc.communications_technology | program.certificate_lt_4_yr.communications_technology | program.bachelors.communications_technology | program.certificate_lt_1_yr.computer | program.certificate_lt_2_yr.computer | program.assoc.computer | program.certificate_lt_4_yr.computer | program.bachelors.computer | program.certificate_lt_1_yr.personal_culinary | program.certificate_lt_2_yr.personal_culinary | program.assoc.personal_culinary | program.certificate_lt_4_yr.personal_culinary | program.bachelors.personal_culinary | program.certificate_lt_1_yr.education | program.certificate_lt_2_yr.education | program.assoc.education | program.certificate_lt_4_yr.education | program.bachelors.education | program.certificate_lt_1_yr.engineering | program.certificate_lt_2_yr.engineering | program.assoc.engineering | program.certificate_lt_4_yr.engineering | program.bachelors.engineering | program.certificate_lt_1_yr.engineering_technology | program.certificate_lt_2_yr.engineering_technology | program.assoc.engineering_technology | program.certificate_lt_4_yr.engineering_technology | program.bachelors.engineering_technology | program.certificate_lt_1_yr.language | program.certificate_lt_2_yr.language | program.assoc.language | program.certificate_lt_4_yr.language | program.bachelors.language | program.certificate_lt_1_yr.family_consumer_science | program.certificate_lt_2_yr.family_consumer_science | program.assoc.family_consumer_science | program.certificate_lt_4_yr.family_consumer_science | program.bachelors.family_consumer_science | program.certificate_lt_1_yr.legal | program.certificate_lt_2_yr.legal | program.assoc.legal | program.certificate_lt_4_yr.legal | program.bachelors.legal | program.certificate_lt_1_yr.english | program.certificate_lt_2_yr.english | program.assoc.english | program.certificate_lt_4_yr.english | program.bachelors.english | program.certificate_lt_1_yr.humanities | program.certificate_lt_2_yr.humanities | program.assoc.humanities | program.certificate_lt_4_yr.humanities | program.bachelors.humanities | program.certificate_lt_1_yr.library | program.certificate_lt_2_yr.library | program.assoc.library | program.certificate_lt_4_yr.library | program.bachelors.library | program.certificate_lt_1_yr.biological | program.certificate_lt_2_yr.biological | program.assoc.biological | program.certificate_lt_4_yr.biological | program.bachelors.biological | program.certificate_lt_1_yr.mathematics | program.certificate_lt_2_yr.mathematics | program.assoc.mathematics | program.certificate_lt_4_yr.mathematics | program.bachelors.mathematics | program.certificate_lt_1_yr.military | program.certificate_lt_2_yr.military | program.assoc.military | program.certificate_lt_4_yr.military | program.bachelors.military | program.certificate_lt_1_yr.multidiscipline | program.certificate_lt_2_yr.multidiscipline | program.assoc.multidiscipline | program.certificate_lt_4_yr.multidiscipline | program.bachelors.multidiscipline | program.certificate_lt_1_yr.parks_recreation_fitness | program.certificate_lt_2_yr.parks_recreation_fitness | program.assoc.parks_recreation_fitness | program.certificate_lt_4_yr.parks_recreation_fitness | program.bachelors.parks_recreation_fitness | program.certificate_lt_1_yr.philosophy_religious | program.certificate_lt_2_yr.philosophy_religious | program.assoc.philosophy_religious | program.certificate_lt_4_yr.philosophy_religious | program.bachelors.philosophy_religious | program.certificate_lt_1_yr.theology_religious_vocation | program.certificate_lt_2_yr.theology_religious_vocation | program.assoc.theology_religious_vocation | program.certificate_lt_4_yr.theology_religious_vocation | program.bachelors.theology_religious_vocation | program.certificate_lt_1_yr.physical_science | program.certificate_lt_2_yr.physical_science | program.assoc.physical_science | program.certificate_lt_4_yr.physical_science | program.bachelors.physical_science | program.certificate_lt_1_yr.science_technology | program.certificate_lt_2_yr.science_technology | program.assoc.science_technology | program.certificate_lt_4_yr.science_technology | program.bachelors.science_technology | program.certificate_lt_1_yr.psychology | program.certificate_lt_2_yr.psychology | program.assoc.psychology | program.certificate_lt_4_yr.psychology | program.bachelors.psychology | program.certificate_lt_1_yr.security_law_enforcement | program.certificate_lt_2_yr.security_law_enforcement | program.assoc.security_law_enforcement | program.certificate_lt_4_yr.security_law_enforcement | program.bachelors.security_law_enforcement | program.certificate_lt_1_yr.public_administration_social_service | program.certificate_lt_2_yr.public_administration_social_service | program.assoc.public_administration_social_service | program.certificate_lt_4_yr.public_administration_social_service | program.bachelors.public_administration_social_service | program.certificate_lt_1_yr.social_science | program.certificate_lt_2_yr.social_science | program.assoc.social_science | program.certificate_lt_4_yr.social_science | program.bachelors.social_science | program.certificate_lt_1_yr.construction | program.certificate_lt_2_yr.construction | program.assoc.construction | program.certificate_lt_4_yr.construction | program.bachelors.construction | program.certificate_lt_1_yr.mechanic_repair_technology | program.certificate_lt_2_yr.mechanic_repair_technology | program.assoc.mechanic_repair_technology | program.certificate_lt_4_yr.mechanic_repair_technology | program.bachelors.mechanic_repair_technology | program.certificate_lt_1_yr.precision_production | program.certificate_lt_2_yr.precision_production | program.assoc.precision_production | program.certificate_lt_4_yr.precision_production | program.bachelors.precision_production | program.certificate_lt_1_yr.transportation | program.certificate_lt_2_yr.transportation | program.assoc.transportation | program.certificate_lt_4_yr.transportation | program.bachelors.transportation | program.certificate_lt_1_yr.visual_performing | program.certificate_lt_2_yr.visual_performing | program.assoc.visual_performing | program.certificate_lt_4_yr.visual_performing | program.bachelors.visual_performing | program.certificate_lt_1_yr.health | program.certificate_lt_2_yr.health | program.assoc.health | program.certificate_lt_4_yr.health | program.bachelors.health | program.certificate_lt_1_yr.business_marketing | program.certificate_lt_2_yr.business_marketing | program.assoc.business_marketing | program.certificate_lt_4_yr.business_marketing | program.bachelors.business_marketing | program.certificate_lt_1_yr.history | program.certificate_lt_2_yr.history | program.assoc.history | program.certificate_lt_4_yr.history | program.bachelors.history | online_only | size | demographics.race_ethnicity.white | demographics.race_ethnicity.black | demographics.race_ethnicity.hispanic | demographics.race_ethnicity.asian | demographics.race_ethnicity.aian | demographics.race_ethnicity.nhpi | demographics.race_ethnicity.two_or_more | demographics.race_ethnicity.non_resident_alien | demographics.race_ethnicity.unknown | part_time_share | operating | avg_net_price.public | avg_net_price.private | net_price.public.by_income_level.0-30000 | net_price.public.by_income_level.30001-48000 | net_price.public.by_income_level.48001-75000 | net_price.public.by_income_level.75001-110000 | net_price.public.by_income_level.110001-plus | net_price.private.by_income_level.0-30000 | net_price.private.by_income_level.30001-48000 | net_price.private.by_income_level.48001-75000 | net_price.private.by_income_level.75001-110000 | net_price.private.by_income_level.110001-plus | net_price.public.by_income_level.0-48000 | net_price.private.by_income_level.0-48000 | net_price.public.by_income_level.30001-75000 | net_price.private.by_income_level.30001-75000 | net_price.public.by_income_level.75000-plus | net_price.private.by_income_level.75000-plus | title_iv.public.all | title_iv.private.all | title_iv.public.by_income_level.0-30000 | title_iv.public.by_income_level.30001-48000 | title_iv.public.by_income_level.48001-75000 | title_iv.public.by_income_level.75001-110000 | title_iv.public.by_income_level.110001-plus | title_iv.private.by_income_level.0-30000 | title_iv.private.by_income_level.30001-48000 | title_iv.private.by_income_level.48001-75000 | title_iv.private.by_income_level.75001-110000 | title_iv.private.by_income_level.110001-plus | attendance.academic_year | attendance.program_year | tuition.in_state | tuition.out_of_state | tuition.program_year | tuition_revenue_per_fte | instructional_expenditure_per_fte | faculty_salary | ft_faculty_rate | pell_grant_rate | completion_rate_4yr_150nt | completion_rate_less_than_4yr_150nt | completion_rate_4yr_150nt_pooled | completion_rate_less_than_4yr_150nt_pooled | pooled_yrs_used | share_first.time_full.time | completion_cohort_4yr_150nt | completion_cohort_less_than_4yr_150nt | completion_cohort_4yr_150nt_pooled | completion_cohort_less_than_4yr_150nt_pooled | completion_rate_4yr_150_white | completion_rate_4yr_150_black | completion_rate_4yr_150_hispanic | completion_rate_4yr_150_asian | completion_rate_4yr_150_aian | completion_rate_4yr_150_nhpi | completion_rate_4yr_150_2ormore | completion_rate_4yr_150_nonresident.alien | completion_rate_4yr_150_race.unknown | completion_rate_l4yr_150_white | completion_rate_l4yr_150_black | completion_rate_l4yr_150_hispanic | completion_rate_l4yr_150_asian | completion_rate_l4yr_150_aian | completion_rate_l4yr_150_nhpi | completion_rate_l4yr_150_2ormore | completion_rate_l4yr_150_nonresident.alien | completion_rate_l4yr_150_race.unknown | retention_rate.four_year.full_time | retention_rate.lt_four_year.full_time | retention_rate.four_year.part_time | retention_rate.lt_four_year.part_time | federal_loan_rate | share_25_older | 3_yr_default_rate | repayment_cohort.3_year_declining_balance | 3_yr_repayment.completers_rate | 3_yr_repayment.noncompleters_rate | 3_yr_repayment.income.0_30000 | 3_yr_repayment.income.30000_75000 | 3_yr_repayment.income.greater_than_75000 | 3_yr_repayment.dependent_students_rate | 3_yr_repayment.independent_students_rate | 3_yr_repayment.pell_grant_rate | 3_yr_repayment.no_pell_grant_rate | 3_yr_repayment.female_students_rate | 3_yr_repayment.male_students_rate | 3_yr_repayment.first_generation_students_rate | 3_yr_repayment.non_first_generation_students_rate | repayment_cohort.5_year_declining_balance | 5_yr_repayment.completers_rate | 5_yr_repayment.noncompleters_rate | 5_yr_repayment.income.0_30000 | 5_yr_repayment.income.30000_75000 | 5_yr_repayment.income.greater_than_75000 | 5_yr_repayment.dependent_students_rate | 5_yr_repayment.independent_students_rate | 5_yr_repayment.pell_grant_rate | 5_yr_repayment.no_pell_grant_rate | 5_yr_repayment.female_students_rate | 5_yr_repayment.male_students_rate | 5_yr_repayment.first_generation_students_rate | 5_yr_repayment.non_first_generation_students_rate | repayment_cohort.7_year_declining_balance | 7_yr_repayment.completers_rate | 7_yr_repayment.noncompleters_rate | 7_yr_repayment.income.0_30000 | 7_yr_repayment.income.30000_75000 | 7_yr_repayment.income.greater_than_75000 | 7_yr_repayment.dependent_students_rate | 7_yr_repayment.independent_students_rate | 7_yr_repayment.pell_grant_rate | 7_yr_repayment.no_pell_grant_rate | 7_yr_repayment.female_students_rate | 7_yr_repayment.male_students_rate | 7_yr_repayment.first_generation_students_rate | 7_yr_repayment.non_first_generation_students_rate | share_lowincome.0_30000 | share_independent_students | share_dependent_lowincome.0_300000 | share_independent_lowincome.0_30000 | share_firstgeneration | share_middleincome.30001_48000 | share_middleincome.48001_75000 | share_highincome.75001_110000 | share_highincome.110001plus | share_dependent_middleincome.300001_48000 | share_dependent_middleincome.48001_75000 | share_dependent_highincome.75001_110000 | share_dependent_highincome.110001plus | share_independent_middleincome.30001_48000 | share_independent_middleincome.48001_75000 | share_independent_highincome.75001_110000 | share_independent_highincome.110001plus | share_firstgeneration_parents.middleschool | share_firstgeneration_parents.highschool | share_firstgeneration_parents.somecollege | fafsa_sent.2_college_allyrs | fafsa_sent.3_college_allyrs | fafsa_sent.4_college_allyrs | fafsa_sent.5plus_college_allyrs | avg_dependent_income.2014dollars | avg_independent_income.2014dollars | loan_principal | median_debt.completers.overall | median_debt.noncompleters | median_debt.income.0_30000 | median_debt.income.30001_75000 | median_debt.income.greater_than_75000 | median_debt.dependent_students | median_debt.independent_students | median_debt.pell_grant | median_debt.no_pell_grant | median_debt.female_students | median_debt.male_students | median_debt.first_generation_students | median_debt.non_first_generation_students | median_debt.number.overall | median_debt.number.completers | median_debt.number.noncompleters | median_debt.number.income.0_30000 | median_debt.number.income.30001_75000 | median_debt.number.income.greater_than_75000 | median_debt.number.dependent_students | median_debt.number.independent_students | median_debt.number.pell_grant | median_debt.number.no_pell_grant | median_debt.number.female_students | median_debt.number.male_students | median_debt.number.first_generation_students | median_debt.number.non_first_generation_students | median_debt.completers.monthly_payments | cumulative_debt.number | cumulative_debt.90th_percentile | cumulative_debt.75th_percentile | cumulative_debt.25th_percentile | cumulative_debt.10th_percentile | family_income.overall | family_income.dependent_students | family_income.independent_students | valid_dependency_status | parents_education_level | FAFSA_applications | 3_yr_repayment.overall | 3_yr_repayment.completers | 3_yr_repayment.noncompleters | 3_yr_repayment.low_income | 3_yr_repayment.middle_income | 3_yr_repayment.high_income | 3_yr_repayment.dependent_students | 3_yr_repayment.independent_students | 3_yr_repayment.pell_grant | 3_yr_repayment.no_pell_grant | 3_yr_repayment.female_students | 3_yr_repayment.male_students | 3_yr_repayment.first_generation_students | 3_yr_repayment.non_first_generation_students | 5_yr_repayment.overall | 5_yr_repayment.completers | 5_yr_repayment.noncompleters | 5_yr_repayment.low_income | 5_yr_repayment.middle_income | 5_yr_repayment.high_income | 5_yr_repayment.dependent_students | 5_yr_repayment.independent_students | 5_yr_repayment.pell_grant | 5_yr_repayment.no_pell_grant | 5_yr_repayment.female_students | 5_yr_repayment.male_students | 5_yr_repayment.first_generation_students | 5_yr_repayment.non_first_generation_students | 7_yr_repayment.overall | 7_yr_repayment.completers | 7_yr_repayment.noncompleters | 7_yr_repayment.low_income | 7_yr_repayment.middle_income | 7_yr_repayment.high_income | 7_yr_repayment.dependent_students | 7_yr_repayment.independent_students | 7_yr_repayment.pell_grant | 7_yr_repayment.no_pell_grant | 7_yr_repayment.female_students | 7_yr_repayment.male_students | 7_yr_repayment.first_generation_students | 7_yr_repayment.non_first_generation_students | students_with_any_loan | students_with_pell_grant | demographics.age_entry | demographics.female_share | demographics.married | demographics.dependent | demographics.veteran | demographics.first_generation | demographics.avg_family_income | demographics.median_family_income | demographics.avg_family_income_independents | median_debt_suppressed.overall | median_debt_suppressed.completers.overall | median_debt_suppressed.completers.monthly_payments | 3_yr_repayment_suppressed.overall | 3_yr_repayment_suppressed.income.low_income | 3_yr_repayment_suppressed.income.middle_income | 3_yr_repayment_suppressed.income.high_income | 3_yr_repayment_suppressed.completers | 3_yr_repayment_suppressed.non_completers | 3_yr_repayment_suppressed.dependent_students | 3_yr_repayment_suppressed.independent_students | 3_yr_repayment_suppressed.pell_grant | 3_yr_repayment_suppressed.no_pell_grant | 3_yr_repayment_suppressed.female_students | 3_yr_repayment_suppressed.male_students | 3_yr_repayment_suppressed.first_generation_students | 3_yr_repayment_suppressed.non_first_generation_students | rate_suppressed.lt_four_year_150percent | rate_suppressed.four_year | rate_suppressed.lt_four_year | rate_suppressed.four_year_200percent | alias | completion_rate_4yr_100nt | completion_cohort_4yr_100nt | completion_rate_less_than_4yr_100nt | completion_cohort_less_than_4yr_100nt | transfer_rate.4yr.full_time | transfer_rate.cohort_4yr.full_time | transfer_rate.less_than_4yr.full_time | transfer_rate.cohort_less_than_4yr.full_time | institutional_characteristics.level | demographics.men | demographics.women | 3_yr_default_rate_denom | title_iv.approval_date | completion_cohort_4yr_150_white | completion_cohort_4yr_150_black | completion_cohort_4yr_150_hispanic | completion_cohort_4yr_150_asian | completion_cohort_4yr_150_aian | completion_cohort_4yr_150_nhpi | completion_cohort_4yr_150_2ormore | completion_cohort_4yr_150_nonresident.alien | completion_cohort_4yr_150_race.unknown | completion_cohort_less_than_4yr_150_white | completion_cohort_less_than_4yr_150_black | completion_cohort_less_than_4yr_150_hispanic | completion_cohort_less_than_4yr_150_asian | completion_cohort_less_than_4yr_150_aian | completion_cohort_less_than_4yr_150_nhpi | completion_cohort_less_than_4yr_150_2ormore | completion_cohort_less_than_4yr_150_nonresident.alien | completion_cohort_less_than_4yr_150_race.unknown | undergrads_with_pell_grant_or_federal_student_loan | open_admissions_policy | undergrads_non_degree_seeking | grad_students | accreditor_code | outcome_cohort.full_time.first_time.6yr | outcome_percentage.full_time.first_time.6yr.award | outcome_cohort.full_time.first_time.8yr | outcome_percentage.full_time.first_time.8yr.award | outcome_percentage.full_time.first_time.8yr.still_enrolled | outcome_percentage.full_time.first_time.8yr.transfer | outcome_percentage.full_time.first_time.8yr.unknown | outcome_cohort.part_time.first_time.6yr | outcome_percentage.part_time.first_time.6yr.award | outcome_cohort.part_time.first_time.8yr | outcome_percentage.part_time.first_time.8yr.award | outcome_percentage.part_time.first_time.8yr.still_enrolled | outcome_percentage.part_time.first_time.8yr.transfer | outcome_percentage.part_time.first_time.8yr.unknown | outcome_cohort.full_time.not_first_time.6yr | outcome_percentage.full_time.not_first_time.6yr.award | outcome_cohort.full_time.not_first_time.8yr | outcome_percentage.full_time.not_first_time.8yr.award | outcome_percentage.full_time.not_first_time.8yr.still_enrolled | outcome_percentage.full_time.not_first_time.8yr.transfer | outcome_percentage.full_time.not_first_time.8yr.unknown | outcome_cohort.part_time.not_first_time.6yr | outcome_percentage.part_time.not_first_time.6yr.award | outcome_cohort.part_time.not_first_time.8yr | outcome_percentage.part_time.not_first_time.8yr.award | outcome_percentage.part_time.not_first_time.8yr.still_enrolled | outcome_percentage.part_time.not_first_time.8yr.transfer | outcome_percentage.part_time.not_first_time.8yr.unknown |
---|
id | ope8_id | ope6_id | name | city | state | zip | accreditor | school_url | price_calculator_url | under_investigation | main_campus | branches | degrees_awarded.predominant | degrees_awarded.highest | ownership | state_fips | region_id | locale | location.lat | location.lon | carnegie_basic | carnegie_undergrad | carnegie_size_setting | minority_serving.historically_black | minority_serving.predominantly_black | minority_serving.annh | minority_serving.tribal | minority_serving.aanipi | minority_serving.hispanic | minority_serving.nant | men_only | women_only | religious_affiliation | admission_rate.overall | admission_rate.by_ope_id | sat_scores.25th_percentile.critical_reading | sat_scores.75th_percentile.critical_reading | sat_scores.25th_percentile.math | sat_scores.75th_percentile.math | sat_scores.25th_percentile.writing | sat_scores.75th_percentile.writing | sat_scores.midpoint.critical_reading | sat_scores.midpoint.math | sat_scores.midpoint.writing | act_scores.25th_percentile.cumulative | act_scores.75th_percentile.cumulative | act_scores.25th_percentile.english | act_scores.75th_percentile.english | act_scores.25th_percentile.math | act_scores.75th_percentile.math | act_scores.25th_percentile.writing | act_scores.75th_percentile.writing | act_scores.midpoint.cumulative | act_scores.midpoint.english | act_scores.midpoint.math | act_scores.midpoint.writing | sat_scores.average.overall | sat_scores.average.by_ope_id | program_percentage.agriculture | program_percentage.resources | program_percentage.architecture | program_percentage.ethnic_cultural_gender | program_percentage.communication | program_percentage.communications_technology | program_percentage.computer | program_percentage.personal_culinary | program_percentage.education | program_percentage.engineering | program_percentage.engineering_technology | program_percentage.language | program_percentage.family_consumer_science | program_percentage.legal | program_percentage.english | program_percentage.humanities | program_percentage.library | program_percentage.biological | program_percentage.mathematics | program_percentage.military | program_percentage.multidiscipline | program_percentage.parks_recreation_fitness | program_percentage.philosophy_religious | program_percentage.theology_religious_vocation | program_percentage.physical_science | program_percentage.science_technology | program_percentage.psychology | program_percentage.security_law_enforcement | program_percentage.public_administration_social_service | program_percentage.social_science | program_percentage.construction | program_percentage.mechanic_repair_technology | program_percentage.precision_production | program_percentage.transportation | program_percentage.visual_performing | program_percentage.health | program_percentage.business_marketing | program_percentage.history | program.certificate_lt_1_yr.agriculture | program.certificate_lt_2_yr.agriculture | program.assoc.agriculture | program.certificate_lt_4_yr.agriculture | program.bachelors.agriculture | program.certificate_lt_1_yr.resources | program.certificate_lt_2_yr.resources | program.assoc.resources | program.certificate_lt_4_yr.resources | program.bachelors.resources | program.certificate_lt_1_yr.architecture | program.certificate_lt_2_yr.architecture | program.assoc.architecture | program.certificate_lt_4_yr.architecture | program.bachelors.architecture | program.certificate_lt_1_yr.ethnic_cultural_gender | program.certificate_lt_2_yr.ethnic_cultural_gender | program.assoc.ethnic_cultural_gender | program.certificate_lt_4_yr.ethnic_cultural_gender | program.bachelors.ethnic_cultural_gender | program.certificate_lt_1_yr.communication | program.certificate_lt_2_yr.communication | program.assoc.communication | program.certificate_lt_4_yr.communication | program.bachelors.communication | program.certificate_lt_1_yr.communications_technology | program.certificate_lt_2_yr.communications_technology | program.assoc.communications_technology | program.certificate_lt_4_yr.communications_technology | program.bachelors.communications_technology | program.certificate_lt_1_yr.computer | program.certificate_lt_2_yr.computer | program.assoc.computer | program.certificate_lt_4_yr.computer | program.bachelors.computer | program.certificate_lt_1_yr.personal_culinary | program.certificate_lt_2_yr.personal_culinary | program.assoc.personal_culinary | program.certificate_lt_4_yr.personal_culinary | program.bachelors.personal_culinary | program.certificate_lt_1_yr.education | program.certificate_lt_2_yr.education | program.assoc.education | program.certificate_lt_4_yr.education | program.bachelors.education | program.certificate_lt_1_yr.engineering | program.certificate_lt_2_yr.engineering | program.assoc.engineering | program.certificate_lt_4_yr.engineering | program.bachelors.engineering | program.certificate_lt_1_yr.engineering_technology | program.certificate_lt_2_yr.engineering_technology | program.assoc.engineering_technology | program.certificate_lt_4_yr.engineering_technology | program.bachelors.engineering_technology | program.certificate_lt_1_yr.language | program.certificate_lt_2_yr.language | program.assoc.language | program.certificate_lt_4_yr.language | program.bachelors.language | program.certificate_lt_1_yr.family_consumer_science | program.certificate_lt_2_yr.family_consumer_science | program.assoc.family_consumer_science | program.certificate_lt_4_yr.family_consumer_science | program.bachelors.family_consumer_science | program.certificate_lt_1_yr.legal | program.certificate_lt_2_yr.legal | program.assoc.legal | program.certificate_lt_4_yr.legal | program.bachelors.legal | program.certificate_lt_1_yr.english | program.certificate_lt_2_yr.english | program.assoc.english | program.certificate_lt_4_yr.english | program.bachelors.english | program.certificate_lt_1_yr.humanities | program.certificate_lt_2_yr.humanities | program.assoc.humanities | program.certificate_lt_4_yr.humanities | program.bachelors.humanities | program.certificate_lt_1_yr.library | program.certificate_lt_2_yr.library | program.assoc.library | program.certificate_lt_4_yr.library | program.bachelors.library | program.certificate_lt_1_yr.biological | program.certificate_lt_2_yr.biological | program.assoc.biological | program.certificate_lt_4_yr.biological | program.bachelors.biological | program.certificate_lt_1_yr.mathematics | program.certificate_lt_2_yr.mathematics | program.assoc.mathematics | program.certificate_lt_4_yr.mathematics | program.bachelors.mathematics | program.certificate_lt_1_yr.military | program.certificate_lt_2_yr.military | program.assoc.military | program.certificate_lt_4_yr.military | program.bachelors.military | program.certificate_lt_1_yr.multidiscipline | program.certificate_lt_2_yr.multidiscipline | program.assoc.multidiscipline | program.certificate_lt_4_yr.multidiscipline | program.bachelors.multidiscipline | program.certificate_lt_1_yr.parks_recreation_fitness | program.certificate_lt_2_yr.parks_recreation_fitness | program.assoc.parks_recreation_fitness | program.certificate_lt_4_yr.parks_recreation_fitness | program.bachelors.parks_recreation_fitness | program.certificate_lt_1_yr.philosophy_religious | program.certificate_lt_2_yr.philosophy_religious | program.assoc.philosophy_religious | program.certificate_lt_4_yr.philosophy_religious | program.bachelors.philosophy_religious | program.certificate_lt_1_yr.theology_religious_vocation | program.certificate_lt_2_yr.theology_religious_vocation | program.assoc.theology_religious_vocation | program.certificate_lt_4_yr.theology_religious_vocation | program.bachelors.theology_religious_vocation | program.certificate_lt_1_yr.physical_science | program.certificate_lt_2_yr.physical_science | program.assoc.physical_science | program.certificate_lt_4_yr.physical_science | program.bachelors.physical_science | program.certificate_lt_1_yr.science_technology | program.certificate_lt_2_yr.science_technology | program.assoc.science_technology | program.certificate_lt_4_yr.science_technology | program.bachelors.science_technology | program.certificate_lt_1_yr.psychology | program.certificate_lt_2_yr.psychology | program.assoc.psychology | program.certificate_lt_4_yr.psychology | program.bachelors.psychology | program.certificate_lt_1_yr.security_law_enforcement | program.certificate_lt_2_yr.security_law_enforcement | program.assoc.security_law_enforcement | program.certificate_lt_4_yr.security_law_enforcement | program.bachelors.security_law_enforcement | program.certificate_lt_1_yr.public_administration_social_service | program.certificate_lt_2_yr.public_administration_social_service | program.assoc.public_administration_social_service | program.certificate_lt_4_yr.public_administration_social_service | program.bachelors.public_administration_social_service | program.certificate_lt_1_yr.social_science | program.certificate_lt_2_yr.social_science | program.assoc.social_science | program.certificate_lt_4_yr.social_science | program.bachelors.social_science | program.certificate_lt_1_yr.construction | program.certificate_lt_2_yr.construction | program.assoc.construction | program.certificate_lt_4_yr.construction | program.bachelors.construction | program.certificate_lt_1_yr.mechanic_repair_technology | program.certificate_lt_2_yr.mechanic_repair_technology | program.assoc.mechanic_repair_technology | program.certificate_lt_4_yr.mechanic_repair_technology | program.bachelors.mechanic_repair_technology | program.certificate_lt_1_yr.precision_production | program.certificate_lt_2_yr.precision_production | program.assoc.precision_production | program.certificate_lt_4_yr.precision_production | program.bachelors.precision_production | program.certificate_lt_1_yr.transportation | program.certificate_lt_2_yr.transportation | program.assoc.transportation | program.certificate_lt_4_yr.transportation | program.bachelors.transportation | program.certificate_lt_1_yr.visual_performing | program.certificate_lt_2_yr.visual_performing | program.assoc.visual_performing | program.certificate_lt_4_yr.visual_performing | program.bachelors.visual_performing | program.certificate_lt_1_yr.health | program.certificate_lt_2_yr.health | program.assoc.health | program.certificate_lt_4_yr.health | program.bachelors.health | program.certificate_lt_1_yr.business_marketing | program.certificate_lt_2_yr.business_marketing | program.assoc.business_marketing | program.certificate_lt_4_yr.business_marketing | program.bachelors.business_marketing | program.certificate_lt_1_yr.history | program.certificate_lt_2_yr.history | program.assoc.history | program.certificate_lt_4_yr.history | program.bachelors.history | online_only | size | demographics.race_ethnicity.white | demographics.race_ethnicity.black | demographics.race_ethnicity.hispanic | demographics.race_ethnicity.asian | demographics.race_ethnicity.aian | demographics.race_ethnicity.nhpi | demographics.race_ethnicity.two_or_more | demographics.race_ethnicity.non_resident_alien | demographics.race_ethnicity.unknown | part_time_share | operating | avg_net_price.public | avg_net_price.private | net_price.public.by_income_level.0-30000 | net_price.public.by_income_level.30001-48000 | net_price.public.by_income_level.48001-75000 | net_price.public.by_income_level.75001-110000 | net_price.public.by_income_level.110001-plus | net_price.private.by_income_level.0-30000 | net_price.private.by_income_level.30001-48000 | net_price.private.by_income_level.48001-75000 | net_price.private.by_income_level.75001-110000 | net_price.private.by_income_level.110001-plus | net_price.public.by_income_level.0-48000 | net_price.private.by_income_level.0-48000 | net_price.public.by_income_level.30001-75000 | net_price.private.by_income_level.30001-75000 | net_price.public.by_income_level.75000-plus | net_price.private.by_income_level.75000-plus | title_iv.public.all | title_iv.private.all | title_iv.public.by_income_level.0-30000 | title_iv.public.by_income_level.30001-48000 | title_iv.public.by_income_level.48001-75000 | title_iv.public.by_income_level.75001-110000 | title_iv.public.by_income_level.110001-plus | title_iv.private.by_income_level.0-30000 | title_iv.private.by_income_level.30001-48000 | title_iv.private.by_income_level.48001-75000 | title_iv.private.by_income_level.75001-110000 | title_iv.private.by_income_level.110001-plus | attendance.academic_year | attendance.program_year | tuition.in_state | tuition.out_of_state | tuition.program_year | tuition_revenue_per_fte | instructional_expenditure_per_fte | faculty_salary | ft_faculty_rate | pell_grant_rate | completion_rate_4yr_150nt | completion_rate_less_than_4yr_150nt | completion_rate_4yr_150nt_pooled | completion_rate_less_than_4yr_150nt_pooled | pooled_yrs_used | share_first.time_full.time | completion_cohort_4yr_150nt | completion_cohort_less_than_4yr_150nt | completion_cohort_4yr_150nt_pooled | completion_cohort_less_than_4yr_150nt_pooled | completion_rate_4yr_150_white | completion_rate_4yr_150_black | completion_rate_4yr_150_hispanic | completion_rate_4yr_150_asian | completion_rate_4yr_150_aian | completion_rate_4yr_150_nhpi | completion_rate_4yr_150_2ormore | completion_rate_4yr_150_nonresident.alien | completion_rate_4yr_150_race.unknown | completion_rate_l4yr_150_white | completion_rate_l4yr_150_black | completion_rate_l4yr_150_hispanic | completion_rate_l4yr_150_asian | completion_rate_l4yr_150_aian | completion_rate_l4yr_150_nhpi | completion_rate_l4yr_150_2ormore | completion_rate_l4yr_150_nonresident.alien | completion_rate_l4yr_150_race.unknown | retention_rate.four_year.full_time | retention_rate.lt_four_year.full_time | retention_rate.four_year.part_time | retention_rate.lt_four_year.part_time | federal_loan_rate | share_25_older | 3_yr_default_rate | repayment_cohort.3_year_declining_balance | 3_yr_repayment.completers_rate | 3_yr_repayment.noncompleters_rate | 3_yr_repayment.income.0_30000 | 3_yr_repayment.income.30000_75000 | 3_yr_repayment.income.greater_than_75000 | 3_yr_repayment.dependent_students_rate | 3_yr_repayment.independent_students_rate | 3_yr_repayment.pell_grant_rate | 3_yr_repayment.no_pell_grant_rate | 3_yr_repayment.female_students_rate | 3_yr_repayment.male_students_rate | 3_yr_repayment.first_generation_students_rate | 3_yr_repayment.non_first_generation_students_rate | repayment_cohort.5_year_declining_balance | 5_yr_repayment.completers_rate | 5_yr_repayment.noncompleters_rate | 5_yr_repayment.income.0_30000 | 5_yr_repayment.income.30000_75000 | 5_yr_repayment.income.greater_than_75000 | 5_yr_repayment.dependent_students_rate | 5_yr_repayment.independent_students_rate | 5_yr_repayment.pell_grant_rate | 5_yr_repayment.no_pell_grant_rate | 5_yr_repayment.female_students_rate | 5_yr_repayment.male_students_rate | 5_yr_repayment.first_generation_students_rate | 5_yr_repayment.non_first_generation_students_rate | repayment_cohort.7_year_declining_balance | 7_yr_repayment.completers_rate | 7_yr_repayment.noncompleters_rate | 7_yr_repayment.income.0_30000 | 7_yr_repayment.income.30000_75000 | 7_yr_repayment.income.greater_than_75000 | 7_yr_repayment.dependent_students_rate | 7_yr_repayment.independent_students_rate | 7_yr_repayment.pell_grant_rate | 7_yr_repayment.no_pell_grant_rate | 7_yr_repayment.female_students_rate | 7_yr_repayment.male_students_rate | 7_yr_repayment.first_generation_students_rate | 7_yr_repayment.non_first_generation_students_rate | share_lowincome.0_30000 | share_independent_students | share_dependent_lowincome.0_300000 | share_independent_lowincome.0_30000 | share_firstgeneration | share_middleincome.30001_48000 | share_middleincome.48001_75000 | share_highincome.75001_110000 | share_highincome.110001plus | share_dependent_middleincome.300001_48000 | share_dependent_middleincome.48001_75000 | share_dependent_highincome.75001_110000 | share_dependent_highincome.110001plus | share_independent_middleincome.30001_48000 | share_independent_middleincome.48001_75000 | share_independent_highincome.75001_110000 | share_independent_highincome.110001plus | share_firstgeneration_parents.middleschool | share_firstgeneration_parents.highschool | share_firstgeneration_parents.somecollege | fafsa_sent.2_college_allyrs | fafsa_sent.3_college_allyrs | fafsa_sent.4_college_allyrs | fafsa_sent.5plus_college_allyrs | avg_dependent_income.2014dollars | avg_independent_income.2014dollars | loan_principal | median_debt.completers.overall | median_debt.noncompleters | median_debt.income.0_30000 | median_debt.income.30001_75000 | median_debt.income.greater_than_75000 | median_debt.dependent_students | median_debt.independent_students | median_debt.pell_grant | median_debt.no_pell_grant | median_debt.female_students | median_debt.male_students | median_debt.first_generation_students | median_debt.non_first_generation_students | median_debt.number.overall | median_debt.number.completers | median_debt.number.noncompleters | median_debt.number.income.0_30000 | median_debt.number.income.30001_75000 | median_debt.number.income.greater_than_75000 | median_debt.number.dependent_students | median_debt.number.independent_students | median_debt.number.pell_grant | median_debt.number.no_pell_grant | median_debt.number.female_students | median_debt.number.male_students | median_debt.number.first_generation_students | median_debt.number.non_first_generation_students | median_debt.completers.monthly_payments | cumulative_debt.number | cumulative_debt.90th_percentile | cumulative_debt.75th_percentile | cumulative_debt.25th_percentile | cumulative_debt.10th_percentile | family_income.overall | family_income.dependent_students | family_income.independent_students | valid_dependency_status | parents_education_level | FAFSA_applications | 3_yr_repayment.overall | 3_yr_repayment.completers | 3_yr_repayment.noncompleters | 3_yr_repayment.low_income | 3_yr_repayment.middle_income | 3_yr_repayment.high_income | 3_yr_repayment.dependent_students | 3_yr_repayment.independent_students | 3_yr_repayment.pell_grant | 3_yr_repayment.no_pell_grant | 3_yr_repayment.female_students | 3_yr_repayment.male_students | 3_yr_repayment.first_generation_students | 3_yr_repayment.non_first_generation_students | 5_yr_repayment.overall | 5_yr_repayment.completers | 5_yr_repayment.noncompleters | 5_yr_repayment.low_income | 5_yr_repayment.middle_income | 5_yr_repayment.high_income | 5_yr_repayment.dependent_students | 5_yr_repayment.independent_students | 5_yr_repayment.pell_grant | 5_yr_repayment.no_pell_grant | 5_yr_repayment.female_students | 5_yr_repayment.male_students | 5_yr_repayment.first_generation_students | 5_yr_repayment.non_first_generation_students | 7_yr_repayment.overall | 7_yr_repayment.completers | 7_yr_repayment.noncompleters | 7_yr_repayment.low_income | 7_yr_repayment.middle_income | 7_yr_repayment.high_income | 7_yr_repayment.dependent_students | 7_yr_repayment.independent_students | 7_yr_repayment.pell_grant | 7_yr_repayment.no_pell_grant | 7_yr_repayment.female_students | 7_yr_repayment.male_students | 7_yr_repayment.first_generation_students | 7_yr_repayment.non_first_generation_students | students_with_any_loan | students_with_pell_grant | demographics.age_entry | demographics.female_share | demographics.married | demographics.dependent | demographics.veteran | demographics.first_generation | demographics.avg_family_income | demographics.median_family_income | demographics.avg_family_income_independents | median_debt_suppressed.overall | median_debt_suppressed.completers.overall | median_debt_suppressed.completers.monthly_payments | 3_yr_repayment_suppressed.overall | 3_yr_repayment_suppressed.income.low_income | 3_yr_repayment_suppressed.income.middle_income | 3_yr_repayment_suppressed.income.high_income | 3_yr_repayment_suppressed.completers | 3_yr_repayment_suppressed.non_completers | 3_yr_repayment_suppressed.dependent_students | 3_yr_repayment_suppressed.independent_students | 3_yr_repayment_suppressed.pell_grant | 3_yr_repayment_suppressed.no_pell_grant | 3_yr_repayment_suppressed.female_students | 3_yr_repayment_suppressed.male_students | 3_yr_repayment_suppressed.first_generation_students | 3_yr_repayment_suppressed.non_first_generation_students | rate_suppressed.lt_four_year_150percent | rate_suppressed.four_year | rate_suppressed.lt_four_year | rate_suppressed.four_year_200percent | alias | completion_rate_4yr_100nt | completion_cohort_4yr_100nt | completion_rate_less_than_4yr_100nt | completion_cohort_less_than_4yr_100nt | transfer_rate.4yr.full_time | transfer_rate.cohort_4yr.full_time | transfer_rate.less_than_4yr.full_time | transfer_rate.cohort_less_than_4yr.full_time | institutional_characteristics.level | demographics.men | demographics.women | 3_yr_default_rate_denom | title_iv.approval_date | completion_cohort_4yr_150_white | completion_cohort_4yr_150_black | completion_cohort_4yr_150_hispanic | completion_cohort_4yr_150_asian | completion_cohort_4yr_150_aian | completion_cohort_4yr_150_nhpi | completion_cohort_4yr_150_2ormore | completion_cohort_4yr_150_nonresident.alien | completion_cohort_4yr_150_race.unknown | completion_cohort_less_than_4yr_150_white | completion_cohort_less_than_4yr_150_black | completion_cohort_less_than_4yr_150_hispanic | completion_cohort_less_than_4yr_150_asian | completion_cohort_less_than_4yr_150_aian | completion_cohort_less_than_4yr_150_nhpi | completion_cohort_less_than_4yr_150_2ormore | completion_cohort_less_than_4yr_150_nonresident.alien | completion_cohort_less_than_4yr_150_race.unknown | undergrads_with_pell_grant_or_federal_student_loan | open_admissions_policy | undergrads_non_degree_seeking | grad_students | accreditor_code | outcome_cohort.full_time.first_time.6yr | outcome_percentage.full_time.first_time.6yr.award | outcome_cohort.full_time.first_time.8yr | outcome_percentage.full_time.first_time.8yr.award | outcome_percentage.full_time.first_time.8yr.still_enrolled | outcome_percentage.full_time.first_time.8yr.transfer | outcome_percentage.full_time.first_time.8yr.unknown | outcome_cohort.part_time.first_time.6yr | outcome_percentage.part_time.first_time.6yr.award | outcome_cohort.part_time.first_time.8yr | outcome_percentage.part_time.first_time.8yr.award | outcome_percentage.part_time.first_time.8yr.still_enrolled | outcome_percentage.part_time.first_time.8yr.transfer | outcome_percentage.part_time.first_time.8yr.unknown | outcome_cohort.full_time.not_first_time.6yr | outcome_percentage.full_time.not_first_time.6yr.award | outcome_cohort.full_time.not_first_time.8yr | outcome_percentage.full_time.not_first_time.8yr.award | outcome_percentage.full_time.not_first_time.8yr.still_enrolled | outcome_percentage.full_time.not_first_time.8yr.transfer | outcome_percentage.full_time.not_first_time.8yr.unknown | outcome_cohort.part_time.not_first_time.6yr | outcome_percentage.part_time.not_first_time.6yr.award | outcome_cohort.part_time.not_first_time.8yr | outcome_percentage.part_time.not_first_time.8yr.award | outcome_percentage.part_time.not_first_time.8yr.still_enrolled | outcome_percentage.part_time.not_first_time.8yr.transfer | outcome_percentage.part_time.not_first_time.8yr.unknown | |
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
1 | 100654 | 100200 | 1002 | Alabama A & M University | Normal | AL | 35762 | Southern Association of Colleges and Schools Commission on Colleges | www.aamu.edu/ | www2.aamu.edu/scripts/netpricecalc/npcalc.htm | 0 | 1 | 1 | 3 | 4 | 1 | 1 | 5 | 12 | 34.783368 | -86.568502 | 18 | 10 | 13 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.6538 | 0.65384128591317 | 383 | 470 | 360 | 480 | 370 | 457 | 427 | 420 | 414 | 16 | 19 | 14 | 20 | 15 | 18 | 18 | 17 | 17 | 850 | 850 | 0.0446 | 0.0023 | 0.0094 | 0 | 0 | 0.0164 | 0.0634 | 0 | 0.1268 | 0.1432 | 0.0587 | 0 | 0.0188 | 0 | 0.0235 | 0.0423 | 0 | 0.1009 | 0.0094 | 0 | 0 | 0 | 0 | 0 | 0.0188 | 0 | 0.0282 | 0.0282 | 0.0516 | 0.0399 | 0 | 0 | 0 | 0 | 0.0258 | 0 | 0.1479 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 4505 | 0.034 | 0.9216 | 0.0058 | 0.0018 | 0.0022 | 0.0018 | 0 | 0.0062 | 0.0266 | 0.0626 | 1 | 13435 | 13075 | 12458 | 15857 | 16022 | 14646 | 12945 | 13718 | 15632 | 743 | 485 | 129 | 76 | 38 | 15 | 20809 | 9366 | 17136 | 9657 | 7941 | 7017 | 0.7096 | 0.7249 | 0.3081 | 0.3303 | 2 | 0.8773 | 1042 | 2086 | 0.375 | 0.3091 | 0 | 0 | 0.3333 | 0 | 0.5779 | 0.3077 | 0.8159 | 0.0877 | 0.165 | 0.2458495231 | 0.4110512129 | 0.1871708952 | 0.2246082414 | 0.2721518987 | 0.2955974843 | 0.2521994135 | 0.2117117117 | 0.2326732673 | 0.3243243243 | 0.2457221081 | 0.2459854015 | 0.2376325088 | 0.2513243084 | 0.32798574 | 0.477631579 | 0.251347709 | 0.322172619 | 0.331825038 | 0.350210971 | 0.329880891 | 0.31629393 | 0.315959162 | 0.386422977 | 0.340535869 | 0.314627415 | 0.327334083 | 0.328413284 | 0.381348511 | 0.579330422 | 0.296180338 | 0.374553252 | 0.376146789 | 0.437229437 | 0.384535548 | 0.364145658 | 0.370547581 | 0.431761787 | 0.416385135 | 0.343636364 | 0.368965517 | 0.388967468 | 0.6325957148 | 0.1131015104 | 0.5932673267 | 0.9409937888 | 0.3887357227 | 0.172110994 | 0.0994028802 | 0.0579557429 | 0.0379346681 | 0.0192989366 | 0.3694367861 | 0.6112642773 | 0.7232174218 | 0.5672637864 | 0.4436248683 | 0.3473832104 | 33295 | 8487 | 14600 | 35000 | 9500 | 14457 | 15000 | 14250 | 14250 | 18998 | 15500 | 9500 | 16000 | 13750 | 14307.5 | 14953 | 3080 | 743 | 2347 | 1938 | 829 | 313 | 2652 | 428 | 2710 | 370 | 1573 | 1507 | 1182 | 1898 | 361.891446885773 | 3080 | 48750 | 32704 | 5500 | 3935 | 2847 | 2525 | 322 | 2847 | 2539 | 2847 | 2831 | 742 | 2089 | 1723 | 790 | 318 | 2387 | 444 | 2424 | 407 | 1461 | 1370 | 1132 | 1699 | 2244 | 760 | 1484 | 1344 | 663 | 237 | 1931 | 313 | 1861 | 383 | 1157 | 1087 | 889 | 1355 | 2284 | 687 | 1597 | 1399 | 654 | 231 | 1927 | 357 | 1881 | 403 | 1184 | 1100 | 870 | 1414 | 0.8963821567 | 0.8609062171 | 20 | 0.5472427116 | 0.0108886547 | 0.8868984896 | 0.0042149631 | 0.3887357227 | 30489 | 21429 | 8487 | 14600 | 35000 | 361.891446885773 | 0.2458495231 | 0.2246082414 | 0.2721518987 | 0.2955974843 | 0.4110512129 | 0.1871708952 | 0.2521994135 | 0.2117117117 | 0.2326732673 | 0.3243243243 | 0.2457221081 | 0.2459854015 | 0.2376325088 | 0.2513243084 | 0.3303 | 0.3335 | AAMU | 0.1104 | 1042 | 0.4012 | 1042 | 1 | 0.4617 | 0.5383 | 1812 | 12/12/1965 | 24 | 1006 | 3 | 3 | 3 | 0 | 0 | 0 | 3 | 4210 | 2 | 1123 | SACSCC | 1044 | 0.3525 | 1044 | 0.3755 | 0 | 0.2213 | 0.4033 | 2 | 0 | 2 | 0 | 0 | 0 | 1 | 110 | 0.4182 | 110 | 0.4364 | 0 | 0.1727 | 0.3909 | 16 | 0.3125 | 16 | 0.3125 | 0 | 0 | 0.6875 | |||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
2 | 100663 | 105200 | 1052 | University of Alabama at Birmingham | Birmingham | AL | 35294-0110 | Southern Association of Colleges and Schools Commission on Colleges | www.uab.edu | uab.studentaidcalculator.com/survey.aspx | 0 | 1 | 1 | 3 | 4 | 1 | 1 | 5 | 12 | 33.50223 | -86.80917 | 15 | 9 | 15 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.6043 | 0.60427528675703 | 520 | 630 | 520 | 668 | 575 | 594 | 22 | 28 | 22 | 30 | 19 | 26 | 25 | 26 | 23 | 1147 | 1147 | 0 | 0 | 0 | 0.0009 | 0.0426 | 0 | 0.0133 | 0 | 0.0815 | 0.0577 | 0 | 0.0069 | 0 | 0 | 0.0192 | 0.0179 | 0 | 0.0715 | 0.0124 | 0 | 0 | 0 | 0.0073 | 0 | 0.0174 | 0 | 0.087 | 0.0366 | 0.0238 | 0.0408 | 0 | 0 | 0 | 0 | 0.0376 | 0.2231 | 0.1837 | 0.0188 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 1 | 0 | 1 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 11269 | 0.5863 | 0.2541 | 0.0317 | 0.0595 | 0.0023 | 0.0006 | 0.0389 | 0.0181 | 0.0085 | 0.2671 | 1 | 16023 | 13614 | 14746 | 17601 | 18873 | 18482 | 13942 | 16112 | 18681 | 955 | 359 | 146 | 134 | 161 | 155 | 22232 | 7766 | 17654 | 10263 | 17548 | 10221 | 0.9081 | 0.3505 | 0.5462 | 0.5504 | 2 | 0.5349 | 1494 | 2740 | 0.5536 | 0.4721 | 0.5946 | 0.7722 | 0.5 | 1 | 0.7222 | 0.6875 | 0.4146 | 0.7864 | 0.6071 | 0.5218 | 0.2363 | 0.053 | 0.5199110572 | 0.6246013667 | 0.4364098837 | 0.4671081678 | 0.5268608414 | 0.6156552331 | 0.5471639951 | 0.4679976512 | 0.4749426793 | 0.5923970433 | 0.5080163471 | 0.5413363533 | 0.5110990796 | 0.5251612903 | 0.57794584 | 0.673230442 | 0.497297297 | 0.529055078 | 0.594090202 | 0.669064748 | 0.605555556 | 0.524660472 | 0.536764706 | 0.639006663 | 0.564189189 | 0.603484321 | 0.574983628 | 0.57970451 | 0.633903921 | 0.756722151 | 0.540776699 | 0.583792723 | 0.66917923 | 0.713355049 | 0.641120725 | 0.619246862 | 0.582528736 | 0.711126469 | 0.619325281 | 0.662571663 | 0.622800845 | 0.64107224 | 0.450312437 | 0.3297722233 | 0.3590977444 | 0.6356968215 | 0.3564593301 | 0.1664986898 | 0.1370691393 | 0.1251763757 | 0.1209433582 | 0.1639097744 | 0.1551879699 | 0.1545864662 | 0.1672180451 | 0.1717603912 | 0.1002444988 | 0.065403423 | 0.0268948655 | 0.0230535015 | 0.3334058286 | 0.6435406699 | 0.516024995 | 0.2676879661 | 0.1664986898 | 0.1072364443 | 60411 | 29795 | 14250 | 21500 | 9500 | 14739 | 14250 | 14000 | 14818.5 | 13250 | 17000 | 11907 | 14750 | 13750 | 14100 | 14500 | 6086 | 2830 | 3279 | 2741 | 1849 | 1496 | 3994 | 2092 | 3747 | 2339 | 3949 | 2137 | 2159 | 3927 | 222.304745944118 | 6086 | 37500 | 26000 | 6250 | 3500 | 4961 | 3325 | 1636 | 4961 | 4598 | 4961 | 4947 | 2195 | 2752 | 2265 | 1545 | 1137 | 3244 | 1703 | 3053 | 1894 | 3181 | 1766 | 1847 | 3100 | 4099 | 1879 | 2220 | 1979 | 1286 | 834 | 2700 | 1399 | 2448 | 1651 | 2664 | 1435 | 1527 | 2572 | 3622 | 1562 | 2060 | 1814 | 1194 | 614 | 2427 | 1195 | 2175 | 1447 | 2401 | 1221 | 1421 | 2201 | 0.8718000403 | 0.6151985487 | 23 | 0.6369683532 | 0.1076395888 | 0.6702277767 | 0.0028220117 | 0.3564593301 | 50315 | 33731 | 29795 | 14250 | 21500 | 222.304745944118 | 0.5199110572 | 0.4671081678 | 0.5268608414 | 0.6156552331 | 0.6246013667 | 0.4364098837 | 0.5471639951 | 0.4679976512 | 0.4749426793 | 0.5923970433 | 0.5080163471 | 0.5413363533 | 0.5110990796 | 0.5251612903 | 0.5504 | 0.5444 | 0.3173 | 1494 | 0.2423 | 1494 | 1 | 0.4116 | 0.5884 | 4159 | 12/1/1965 | 932 | 358 | 37 | 79 | 12 | 1 | 18 | 16 | 41 | 11679 | 2 | 242 | 6822 | SACSCC | 1246 | 0.5546 | 1245 | 0.5936 | 0.0169 | 0.2635 | 0.1261 | 30 | 0.2 | 30 | 0.3 | 0.1 | 0.2667 | 0.3333 | 686 | 0.6181 | 686 | 0.6327 | 0.0102 | 0.2187 | 0.1385 | 248 | 0.3589 | 248 | 0.4032 | 0.0444 | 0.25 | 0.3024 | |||||||||||||||||||||||||||||||||||||||||||||||||||||||
3 | 100690 | 2503400 | 25034 | Amridge University | Montgomery | AL | 36117-3553 | Southern Association of Colleges and Schools Commission on Colleges | www.amridgeuniversity.edu | www2.amridgeuniversity.edu:9091/ | 0 | 1 | 1 | 3 | 4 | 2 | 1 | 5 | 12 | 32.362609 | -86.17401 | 21 | 5 | 6 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 74 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.2453 | 0 | 0 | 0.0566 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.1698 | 0 | 0 | 0 | 0.1321 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.3962 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 1 | 308 | 0.211 | 0.3409 | 0.0195 | 0 | 0 | 0.0032 | 0 | 0 | 0.4253 | 0.5714 | 1 | 8862 | 8453 | 12133 | 8862 | 12133 | 9 | 8 | 1 | 0 | 0 | 0 | 12133 | 6900 | 6900 | 17071 | 7113 | 3217 | 1 | 0.7455 | 0.4 | 0.3333 | 4 | 0.2078 | 5 | 18 | 0.6667 | 0 | 0 | 0.6667 | 0.6667 | 0.8781 | 0.8571 | 0.1 | 0.2331002331 | 0.4576271186 | 0.1972972973 | 0.1638225256 | 0.325 | 0.2236503856 | 0.1966292135 | 0.4109589041 | 0.1895910781 | 0.30625 | 0.2248803828 | 0.2409090909 | 0.394230769 | 0.636363636 | 0.342412451 | 0.363636364 | 0.412844037 | 0.518518519 | 0.615384615 | 0.374125874 | 0.328888889 | 0.563218391 | 0.359550562 | 0.440298508 | 0.411428571 | 0.372262774 | 0.468531469 | 0.576923077 | 0.444444444 | 0.441176471 | 0.424390244 | 0.580246914 | 0.388235294 | 0.586206897 | 0.46 | 0.477941177 | 0.7912087912 | 0.8827838828 | 0.5285714286 | 0.1318681319 | 0.0366300366 | 0.0619047619 | 0.4666666667 | 0.4714285714 | 0.5347985348 | 0.293040293 | 0.1941391941 | 0.1098901099 | 25829 | 18765 | 11082 | 23000 | 9500 | 9500 | 15750 | 18469 | 5500 | 12500 | 10713 | 11791 | 12500 | 9500 | 10500 | 12500 | 369 | 41 | 331 | 253 | 97 | 19 | 36 | 333 | 329 | 40 | 216 | 153 | 205 | 164 | 237.814379382079 | 369 | 36000 | 23500 | 5063 | 3166 | 273 | 32 | 241 | 273 | 210 | 273 | 429 | 59 | 370 | 293 | 118 | 18 | 40 | 389 | 356 | 73 | 269 | 160 | 209 | 220 | 312 | 55 | 257 | 176 | 109 | 27 | 26 | 286 | 225 | 87 | 178 | 134 | 175 | 137 | 286 | 52 | 234 | 170 | 97 | 19 | 20 | 266 | 205 | 81 | 170 | 116 | 150 | 136 | 0.9413919414 | 0.8974358974 | 33 | 0.6043956044 | 0.2564102564 | 0.1172161172 | 0.5285714286 | 19593 | 14631 | 18765 | 11082 | 23000 | 237.814379382079 | 0.2331002331 | 0.1638225256 | 0.4576271186 | 0.1972972973 | 0.325 | 0.2236503856 | 0.1966292135 | 0.4109589041 | 0.1895910781 | 0.30625 | 0.2248803828 | 0.2409090909 | Southern Christian University |Regions University | 0 | 2 | 0.4 | 5 | 1 | 0.4286 | 0.5714 | 380 | 3/26/1987 | 3 | 1 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 279 | 1 | 319 | SACSCC | 12 | 0.25 | 12 | 0.25 | 0.0833 | 0.3333 | 0.3333 | 8 | 0 | 8 | 0 | 0 | 1 | 0 | 80 | 0.5375 | 80 | 0.55 | 0.0125 | 0.4375 | 0 | 36 | 0.5 | 36 | 0.5278 | 0.0278 | 0.4444 | 0 |
That’s already much better. We now have 622 columns with mostly meaningful names and proper types.
Factor Columns
Now let’s look into those “VALUE” and “LABEL” columns from the data dictionary. Everything in the VALUE column is an integer, which means they’re pretty close to an index of a factor. Interesting. Watch how it lets us clean up the “degrees_awarded.predominant” column (which just contains seemingly random integers above), for example.
sub_dictionaries <- data_dictionary %>%
dplyr::filter(!is.na(VALUE)) %>%
dplyr::select(better_column_name = `developer-friendly name`, current_value = VALUE, target_value = LABEL) %>%
tidyr::fill(better_column_name, .direction = "down")
factor_columns <- unique(sub_dictionaries$better_column_name)
latest_college_scorecard_factored <- purrr::map_dfc(colnames(latest_college_scorecard), function(this_column) {
if(this_column %in% factor_columns) {
# Translate this to a factor.
this_dictionary <- sub_dictionaries %>%
dplyr::filter(better_column_name == this_column) %>%
dplyr::rename(!! this_column := current_value) %>%
dplyr::select(-better_column_name)
new_column <- latest_college_scorecard[this_column] %>%
dplyr::left_join(this_dictionary) %>%
dplyr::select(target_value) %>%
dplyr::mutate(target_value = as.factor(target_value))
names(new_column) <- this_column
new_column
} else {
latest_college_scorecard[this_column]
}
})
DT::datatable(head(latest_college_scorecard_factored, 50))
id | ope8_id | ope6_id | name | city | state | zip | accreditor | school_url | price_calculator_url | under_investigation | main_campus | branches | degrees_awarded.predominant | degrees_awarded.highest | ownership | state_fips | region_id | locale | location.lat | location.lon | carnegie_basic | carnegie_undergrad | carnegie_size_setting | minority_serving.historically_black | minority_serving.predominantly_black | minority_serving.annh | minority_serving.tribal | minority_serving.aanipi | minority_serving.hispanic | minority_serving.nant | men_only | women_only | religious_affiliation | admission_rate.overall | admission_rate.by_ope_id | sat_scores.25th_percentile.critical_reading | sat_scores.75th_percentile.critical_reading | sat_scores.25th_percentile.math | sat_scores.75th_percentile.math | sat_scores.25th_percentile.writing | sat_scores.75th_percentile.writing | sat_scores.midpoint.critical_reading | sat_scores.midpoint.math | sat_scores.midpoint.writing | act_scores.25th_percentile.cumulative | act_scores.75th_percentile.cumulative | act_scores.25th_percentile.english | act_scores.75th_percentile.english | act_scores.25th_percentile.math | act_scores.75th_percentile.math | act_scores.25th_percentile.writing | act_scores.75th_percentile.writing | act_scores.midpoint.cumulative | act_scores.midpoint.english | act_scores.midpoint.math | act_scores.midpoint.writing | sat_scores.average.overall | sat_scores.average.by_ope_id | program_percentage.agriculture | program_percentage.resources | program_percentage.architecture | program_percentage.ethnic_cultural_gender | program_percentage.communication | program_percentage.communications_technology | program_percentage.computer | program_percentage.personal_culinary | program_percentage.education | program_percentage.engineering | program_percentage.engineering_technology | program_percentage.language | program_percentage.family_consumer_science | program_percentage.legal | program_percentage.english | program_percentage.humanities | program_percentage.library | program_percentage.biological | program_percentage.mathematics | program_percentage.military | program_percentage.multidiscipline | program_percentage.parks_recreation_fitness | program_percentage.philosophy_religious | program_percentage.theology_religious_vocation | program_percentage.physical_science | program_percentage.science_technology | program_percentage.psychology | program_percentage.security_law_enforcement | program_percentage.public_administration_social_service | program_percentage.social_science | program_percentage.construction | program_percentage.mechanic_repair_technology | program_percentage.precision_production | program_percentage.transportation | program_percentage.visual_performing | program_percentage.health | program_percentage.business_marketing | program_percentage.history | program.certificate_lt_1_yr.agriculture | program.certificate_lt_2_yr.agriculture | program.assoc.agriculture | program.certificate_lt_4_yr.agriculture | program.bachelors.agriculture | program.certificate_lt_1_yr.resources | program.certificate_lt_2_yr.resources | program.assoc.resources | program.certificate_lt_4_yr.resources | program.bachelors.resources | program.certificate_lt_1_yr.architecture | program.certificate_lt_2_yr.architecture | program.assoc.architecture | program.certificate_lt_4_yr.architecture | program.bachelors.architecture | program.certificate_lt_1_yr.ethnic_cultural_gender | program.certificate_lt_2_yr.ethnic_cultural_gender | program.assoc.ethnic_cultural_gender | program.certificate_lt_4_yr.ethnic_cultural_gender | program.bachelors.ethnic_cultural_gender | program.certificate_lt_1_yr.communication | program.certificate_lt_2_yr.communication | program.assoc.communication | program.certificate_lt_4_yr.communication | program.bachelors.communication | program.certificate_lt_1_yr.communications_technology | program.certificate_lt_2_yr.communications_technology | program.assoc.communications_technology | program.certificate_lt_4_yr.communications_technology | program.bachelors.communications_technology | program.certificate_lt_1_yr.computer | program.certificate_lt_2_yr.computer | program.assoc.computer | program.certificate_lt_4_yr.computer | program.bachelors.computer | program.certificate_lt_1_yr.personal_culinary | program.certificate_lt_2_yr.personal_culinary | program.assoc.personal_culinary | program.certificate_lt_4_yr.personal_culinary | program.bachelors.personal_culinary | program.certificate_lt_1_yr.education | program.certificate_lt_2_yr.education | program.assoc.education | program.certificate_lt_4_yr.education | program.bachelors.education | program.certificate_lt_1_yr.engineering | program.certificate_lt_2_yr.engineering | program.assoc.engineering | program.certificate_lt_4_yr.engineering | program.bachelors.engineering | program.certificate_lt_1_yr.engineering_technology | program.certificate_lt_2_yr.engineering_technology | program.assoc.engineering_technology | program.certificate_lt_4_yr.engineering_technology | program.bachelors.engineering_technology | program.certificate_lt_1_yr.language | program.certificate_lt_2_yr.language | program.assoc.language | program.certificate_lt_4_yr.language | program.bachelors.language | program.certificate_lt_1_yr.family_consumer_science | program.certificate_lt_2_yr.family_consumer_science | program.assoc.family_consumer_science | program.certificate_lt_4_yr.family_consumer_science | program.bachelors.family_consumer_science | program.certificate_lt_1_yr.legal | program.certificate_lt_2_yr.legal | program.assoc.legal | program.certificate_lt_4_yr.legal | program.bachelors.legal | program.certificate_lt_1_yr.english | program.certificate_lt_2_yr.english | program.assoc.english | program.certificate_lt_4_yr.english | program.bachelors.english | program.certificate_lt_1_yr.humanities | program.certificate_lt_2_yr.humanities | program.assoc.humanities | program.certificate_lt_4_yr.humanities | program.bachelors.humanities | program.certificate_lt_1_yr.library | program.certificate_lt_2_yr.library | program.assoc.library | program.certificate_lt_4_yr.library | program.bachelors.library | program.certificate_lt_1_yr.biological | program.certificate_lt_2_yr.biological | program.assoc.biological | program.certificate_lt_4_yr.biological | program.bachelors.biological | program.certificate_lt_1_yr.mathematics | program.certificate_lt_2_yr.mathematics | program.assoc.mathematics | program.certificate_lt_4_yr.mathematics | program.bachelors.mathematics | program.certificate_lt_1_yr.military | program.certificate_lt_2_yr.military | program.assoc.military | program.certificate_lt_4_yr.military | program.bachelors.military | program.certificate_lt_1_yr.multidiscipline | program.certificate_lt_2_yr.multidiscipline | program.assoc.multidiscipline | program.certificate_lt_4_yr.multidiscipline | program.bachelors.multidiscipline | program.certificate_lt_1_yr.parks_recreation_fitness | program.certificate_lt_2_yr.parks_recreation_fitness | program.assoc.parks_recreation_fitness | program.certificate_lt_4_yr.parks_recreation_fitness | program.bachelors.parks_recreation_fitness | program.certificate_lt_1_yr.philosophy_religious | program.certificate_lt_2_yr.philosophy_religious | program.assoc.philosophy_religious | program.certificate_lt_4_yr.philosophy_religious | program.bachelors.philosophy_religious | program.certificate_lt_1_yr.theology_religious_vocation | program.certificate_lt_2_yr.theology_religious_vocation | program.assoc.theology_religious_vocation | program.certificate_lt_4_yr.theology_religious_vocation | program.bachelors.theology_religious_vocation | program.certificate_lt_1_yr.physical_science | program.certificate_lt_2_yr.physical_science | program.assoc.physical_science | program.certificate_lt_4_yr.physical_science | program.bachelors.physical_science | program.certificate_lt_1_yr.science_technology | program.certificate_lt_2_yr.science_technology | program.assoc.science_technology | program.certificate_lt_4_yr.science_technology | program.bachelors.science_technology | program.certificate_lt_1_yr.psychology | program.certificate_lt_2_yr.psychology | program.assoc.psychology | program.certificate_lt_4_yr.psychology | program.bachelors.psychology | program.certificate_lt_1_yr.security_law_enforcement | program.certificate_lt_2_yr.security_law_enforcement | program.assoc.security_law_enforcement | program.certificate_lt_4_yr.security_law_enforcement | program.bachelors.security_law_enforcement | program.certificate_lt_1_yr.public_administration_social_service | program.certificate_lt_2_yr.public_administration_social_service | program.assoc.public_administration_social_service | program.certificate_lt_4_yr.public_administration_social_service | program.bachelors.public_administration_social_service | program.certificate_lt_1_yr.social_science | program.certificate_lt_2_yr.social_science | program.assoc.social_science | program.certificate_lt_4_yr.social_science | program.bachelors.social_science | program.certificate_lt_1_yr.construction | program.certificate_lt_2_yr.construction | program.assoc.construction | program.certificate_lt_4_yr.construction | program.bachelors.construction | program.certificate_lt_1_yr.mechanic_repair_technology | program.certificate_lt_2_yr.mechanic_repair_technology | program.assoc.mechanic_repair_technology | program.certificate_lt_4_yr.mechanic_repair_technology | program.bachelors.mechanic_repair_technology | program.certificate_lt_1_yr.precision_production | program.certificate_lt_2_yr.precision_production | program.assoc.precision_production | program.certificate_lt_4_yr.precision_production | program.bachelors.precision_production | program.certificate_lt_1_yr.transportation | program.certificate_lt_2_yr.transportation | program.assoc.transportation | program.certificate_lt_4_yr.transportation | program.bachelors.transportation | program.certificate_lt_1_yr.visual_performing | program.certificate_lt_2_yr.visual_performing | program.assoc.visual_performing | program.certificate_lt_4_yr.visual_performing | program.bachelors.visual_performing | program.certificate_lt_1_yr.health | program.certificate_lt_2_yr.health | program.assoc.health | program.certificate_lt_4_yr.health | program.bachelors.health | program.certificate_lt_1_yr.business_marketing | program.certificate_lt_2_yr.business_marketing | program.assoc.business_marketing | program.certificate_lt_4_yr.business_marketing | program.bachelors.business_marketing | program.certificate_lt_1_yr.history | program.certificate_lt_2_yr.history | program.assoc.history | program.certificate_lt_4_yr.history | program.bachelors.history | online_only | size | demographics.race_ethnicity.white | demographics.race_ethnicity.black | demographics.race_ethnicity.hispanic | demographics.race_ethnicity.asian | demographics.race_ethnicity.aian | demographics.race_ethnicity.nhpi | demographics.race_ethnicity.two_or_more | demographics.race_ethnicity.non_resident_alien | demographics.race_ethnicity.unknown | part_time_share | operating | avg_net_price.public | avg_net_price.private | net_price.public.by_income_level.0-30000 | net_price.public.by_income_level.30001-48000 | net_price.public.by_income_level.48001-75000 | net_price.public.by_income_level.75001-110000 | net_price.public.by_income_level.110001-plus | net_price.private.by_income_level.0-30000 | net_price.private.by_income_level.30001-48000 | net_price.private.by_income_level.48001-75000 | net_price.private.by_income_level.75001-110000 | net_price.private.by_income_level.110001-plus | net_price.public.by_income_level.0-48000 | net_price.private.by_income_level.0-48000 | net_price.public.by_income_level.30001-75000 | net_price.private.by_income_level.30001-75000 | net_price.public.by_income_level.75000-plus | net_price.private.by_income_level.75000-plus | title_iv.public.all | title_iv.private.all | title_iv.public.by_income_level.0-30000 | title_iv.public.by_income_level.30001-48000 | title_iv.public.by_income_level.48001-75000 | title_iv.public.by_income_level.75001-110000 | title_iv.public.by_income_level.110001-plus | title_iv.private.by_income_level.0-30000 | title_iv.private.by_income_level.30001-48000 | title_iv.private.by_income_level.48001-75000 | title_iv.private.by_income_level.75001-110000 | title_iv.private.by_income_level.110001-plus | attendance.academic_year | attendance.program_year | tuition.in_state | tuition.out_of_state | tuition.program_year | tuition_revenue_per_fte | instructional_expenditure_per_fte | faculty_salary | ft_faculty_rate | pell_grant_rate | completion_rate_4yr_150nt | completion_rate_less_than_4yr_150nt | completion_rate_4yr_150nt_pooled | completion_rate_less_than_4yr_150nt_pooled | pooled_yrs_used | share_first.time_full.time | completion_cohort_4yr_150nt | completion_cohort_less_than_4yr_150nt | completion_cohort_4yr_150nt_pooled | completion_cohort_less_than_4yr_150nt_pooled | completion_rate_4yr_150_white | completion_rate_4yr_150_black | completion_rate_4yr_150_hispanic | completion_rate_4yr_150_asian | completion_rate_4yr_150_aian | completion_rate_4yr_150_nhpi | completion_rate_4yr_150_2ormore | completion_rate_4yr_150_nonresident.alien | completion_rate_4yr_150_race.unknown | completion_rate_l4yr_150_white | completion_rate_l4yr_150_black | completion_rate_l4yr_150_hispanic | completion_rate_l4yr_150_asian | completion_rate_l4yr_150_aian | completion_rate_l4yr_150_nhpi | completion_rate_l4yr_150_2ormore | completion_rate_l4yr_150_nonresident.alien | completion_rate_l4yr_150_race.unknown | retention_rate.four_year.full_time | retention_rate.lt_four_year.full_time | retention_rate.four_year.part_time | retention_rate.lt_four_year.part_time | federal_loan_rate | share_25_older | 3_yr_default_rate | repayment_cohort.3_year_declining_balance | 3_yr_repayment.completers_rate | 3_yr_repayment.noncompleters_rate | 3_yr_repayment.income.0_30000 | 3_yr_repayment.income.30000_75000 | 3_yr_repayment.income.greater_than_75000 | 3_yr_repayment.dependent_students_rate | 3_yr_repayment.independent_students_rate | 3_yr_repayment.pell_grant_rate | 3_yr_repayment.no_pell_grant_rate | 3_yr_repayment.female_students_rate | 3_yr_repayment.male_students_rate | 3_yr_repayment.first_generation_students_rate | 3_yr_repayment.non_first_generation_students_rate | repayment_cohort.5_year_declining_balance | 5_yr_repayment.completers_rate | 5_yr_repayment.noncompleters_rate | 5_yr_repayment.income.0_30000 | 5_yr_repayment.income.30000_75000 | 5_yr_repayment.income.greater_than_75000 | 5_yr_repayment.dependent_students_rate | 5_yr_repayment.independent_students_rate | 5_yr_repayment.pell_grant_rate | 5_yr_repayment.no_pell_grant_rate | 5_yr_repayment.female_students_rate | 5_yr_repayment.male_students_rate | 5_yr_repayment.first_generation_students_rate | 5_yr_repayment.non_first_generation_students_rate | repayment_cohort.7_year_declining_balance | 7_yr_repayment.completers_rate | 7_yr_repayment.noncompleters_rate | 7_yr_repayment.income.0_30000 | 7_yr_repayment.income.30000_75000 | 7_yr_repayment.income.greater_than_75000 | 7_yr_repayment.dependent_students_rate | 7_yr_repayment.independent_students_rate | 7_yr_repayment.pell_grant_rate | 7_yr_repayment.no_pell_grant_rate | 7_yr_repayment.female_students_rate | 7_yr_repayment.male_students_rate | 7_yr_repayment.first_generation_students_rate | 7_yr_repayment.non_first_generation_students_rate | share_lowincome.0_30000 | share_independent_students | share_dependent_lowincome.0_300000 | share_independent_lowincome.0_30000 | share_firstgeneration | share_middleincome.30001_48000 | share_middleincome.48001_75000 | share_highincome.75001_110000 | share_highincome.110001plus | share_dependent_middleincome.300001_48000 | share_dependent_middleincome.48001_75000 | share_dependent_highincome.75001_110000 | share_dependent_highincome.110001plus | share_independent_middleincome.30001_48000 | share_independent_middleincome.48001_75000 | share_independent_highincome.75001_110000 | share_independent_highincome.110001plus | share_firstgeneration_parents.middleschool | share_firstgeneration_parents.highschool | share_firstgeneration_parents.somecollege | fafsa_sent.2_college_allyrs | fafsa_sent.3_college_allyrs | fafsa_sent.4_college_allyrs | fafsa_sent.5plus_college_allyrs | avg_dependent_income.2014dollars | avg_independent_income.2014dollars | loan_principal | median_debt.completers.overall | median_debt.noncompleters | median_debt.income.0_30000 | median_debt.income.30001_75000 | median_debt.income.greater_than_75000 | median_debt.dependent_students | median_debt.independent_students | median_debt.pell_grant | median_debt.no_pell_grant | median_debt.female_students | median_debt.male_students | median_debt.first_generation_students | median_debt.non_first_generation_students | median_debt.number.overall | median_debt.number.completers | median_debt.number.noncompleters | median_debt.number.income.0_30000 | median_debt.number.income.30001_75000 | median_debt.number.income.greater_than_75000 | median_debt.number.dependent_students | median_debt.number.independent_students | median_debt.number.pell_grant | median_debt.number.no_pell_grant | median_debt.number.female_students | median_debt.number.male_students | median_debt.number.first_generation_students | median_debt.number.non_first_generation_students | median_debt.completers.monthly_payments | cumulative_debt.number | cumulative_debt.90th_percentile | cumulative_debt.75th_percentile | cumulative_debt.25th_percentile | cumulative_debt.10th_percentile | family_income.overall | family_income.dependent_students | family_income.independent_students | valid_dependency_status | parents_education_level | FAFSA_applications | 3_yr_repayment.overall | 3_yr_repayment.completers | 3_yr_repayment.noncompleters | 3_yr_repayment.low_income | 3_yr_repayment.middle_income | 3_yr_repayment.high_income | 3_yr_repayment.dependent_students | 3_yr_repayment.independent_students | 3_yr_repayment.pell_grant | 3_yr_repayment.no_pell_grant | 3_yr_repayment.female_students | 3_yr_repayment.male_students | 3_yr_repayment.first_generation_students | 3_yr_repayment.non_first_generation_students | 5_yr_repayment.overall | 5_yr_repayment.completers | 5_yr_repayment.noncompleters | 5_yr_repayment.low_income | 5_yr_repayment.middle_income | 5_yr_repayment.high_income | 5_yr_repayment.dependent_students | 5_yr_repayment.independent_students | 5_yr_repayment.pell_grant | 5_yr_repayment.no_pell_grant | 5_yr_repayment.female_students | 5_yr_repayment.male_students | 5_yr_repayment.first_generation_students | 5_yr_repayment.non_first_generation_students | 7_yr_repayment.overall | 7_yr_repayment.completers | 7_yr_repayment.noncompleters | 7_yr_repayment.low_income | 7_yr_repayment.middle_income | 7_yr_repayment.high_income | 7_yr_repayment.dependent_students | 7_yr_repayment.independent_students | 7_yr_repayment.pell_grant | 7_yr_repayment.no_pell_grant | 7_yr_repayment.female_students | 7_yr_repayment.male_students | 7_yr_repayment.first_generation_students | 7_yr_repayment.non_first_generation_students | students_with_any_loan | students_with_pell_grant | demographics.age_entry | demographics.female_share | demographics.married | demographics.dependent | demographics.veteran | demographics.first_generation | demographics.avg_family_income | demographics.median_family_income | demographics.avg_family_income_independents | median_debt_suppressed.overall | median_debt_suppressed.completers.overall | median_debt_suppressed.completers.monthly_payments | 3_yr_repayment_suppressed.overall | 3_yr_repayment_suppressed.income.low_income | 3_yr_repayment_suppressed.income.middle_income | 3_yr_repayment_suppressed.income.high_income | 3_yr_repayment_suppressed.completers | 3_yr_repayment_suppressed.non_completers | 3_yr_repayment_suppressed.dependent_students | 3_yr_repayment_suppressed.independent_students | 3_yr_repayment_suppressed.pell_grant | 3_yr_repayment_suppressed.no_pell_grant | 3_yr_repayment_suppressed.female_students | 3_yr_repayment_suppressed.male_students | 3_yr_repayment_suppressed.first_generation_students | 3_yr_repayment_suppressed.non_first_generation_students | rate_suppressed.lt_four_year_150percent | rate_suppressed.four_year | rate_suppressed.lt_four_year | rate_suppressed.four_year_200percent | alias | completion_rate_4yr_100nt | completion_cohort_4yr_100nt | completion_rate_less_than_4yr_100nt | completion_cohort_less_than_4yr_100nt | transfer_rate.4yr.full_time | transfer_rate.cohort_4yr.full_time | transfer_rate.less_than_4yr.full_time | transfer_rate.cohort_less_than_4yr.full_time | institutional_characteristics.level | demographics.men | demographics.women | 3_yr_default_rate_denom | title_iv.approval_date | completion_cohort_4yr_150_white | completion_cohort_4yr_150_black | completion_cohort_4yr_150_hispanic | completion_cohort_4yr_150_asian | completion_cohort_4yr_150_aian | completion_cohort_4yr_150_nhpi | completion_cohort_4yr_150_2ormore | completion_cohort_4yr_150_nonresident.alien | completion_cohort_4yr_150_race.unknown | completion_cohort_less_than_4yr_150_white | completion_cohort_less_than_4yr_150_black | completion_cohort_less_than_4yr_150_hispanic | completion_cohort_less_than_4yr_150_asian | completion_cohort_less_than_4yr_150_aian | completion_cohort_less_than_4yr_150_nhpi | completion_cohort_less_than_4yr_150_2ormore | completion_cohort_less_than_4yr_150_nonresident.alien | completion_cohort_less_than_4yr_150_race.unknown | undergrads_with_pell_grant_or_federal_student_loan | open_admissions_policy | undergrads_non_degree_seeking | grad_students | accreditor_code | outcome_cohort.full_time.first_time.6yr | outcome_percentage.full_time.first_time.6yr.award | outcome_cohort.full_time.first_time.8yr | outcome_percentage.full_time.first_time.8yr.award | outcome_percentage.full_time.first_time.8yr.still_enrolled | outcome_percentage.full_time.first_time.8yr.transfer | outcome_percentage.full_time.first_time.8yr.unknown | outcome_cohort.part_time.first_time.6yr | outcome_percentage.part_time.first_time.6yr.award | outcome_cohort.part_time.first_time.8yr | outcome_percentage.part_time.first_time.8yr.award | outcome_percentage.part_time.first_time.8yr.still_enrolled | outcome_percentage.part_time.first_time.8yr.transfer | outcome_percentage.part_time.first_time.8yr.unknown | outcome_cohort.full_time.not_first_time.6yr | outcome_percentage.full_time.not_first_time.6yr.award | outcome_cohort.full_time.not_first_time.8yr | outcome_percentage.full_time.not_first_time.8yr.award | outcome_percentage.full_time.not_first_time.8yr.still_enrolled | outcome_percentage.full_time.not_first_time.8yr.transfer | outcome_percentage.full_time.not_first_time.8yr.unknown | outcome_cohort.part_time.not_first_time.6yr | outcome_percentage.part_time.not_first_time.6yr.award | outcome_cohort.part_time.not_first_time.8yr | outcome_percentage.part_time.not_first_time.8yr.award | outcome_percentage.part_time.not_first_time.8yr.still_enrolled | outcome_percentage.part_time.not_first_time.8yr.transfer | outcome_percentage.part_time.not_first_time.8yr.unknown |
---|
id | ope8_id | ope6_id | name | city | state | zip | accreditor | school_url | price_calculator_url | under_investigation | main_campus | branches | degrees_awarded.predominant | degrees_awarded.highest | ownership | state_fips | region_id | locale | location.lat | location.lon | carnegie_basic | carnegie_undergrad | carnegie_size_setting | minority_serving.historically_black | minority_serving.predominantly_black | minority_serving.annh | minority_serving.tribal | minority_serving.aanipi | minority_serving.hispanic | minority_serving.nant | men_only | women_only | religious_affiliation | admission_rate.overall | admission_rate.by_ope_id | sat_scores.25th_percentile.critical_reading | sat_scores.75th_percentile.critical_reading | sat_scores.25th_percentile.math | sat_scores.75th_percentile.math | sat_scores.25th_percentile.writing | sat_scores.75th_percentile.writing | sat_scores.midpoint.critical_reading | sat_scores.midpoint.math | sat_scores.midpoint.writing | act_scores.25th_percentile.cumulative | act_scores.75th_percentile.cumulative | act_scores.25th_percentile.english | act_scores.75th_percentile.english | act_scores.25th_percentile.math | act_scores.75th_percentile.math | act_scores.25th_percentile.writing | act_scores.75th_percentile.writing | act_scores.midpoint.cumulative | act_scores.midpoint.english | act_scores.midpoint.math | act_scores.midpoint.writing | sat_scores.average.overall | sat_scores.average.by_ope_id | program_percentage.agriculture | program_percentage.resources | program_percentage.architecture | program_percentage.ethnic_cultural_gender | program_percentage.communication | program_percentage.communications_technology | program_percentage.computer | program_percentage.personal_culinary | program_percentage.education | program_percentage.engineering | program_percentage.engineering_technology | program_percentage.language | program_percentage.family_consumer_science | program_percentage.legal | program_percentage.english | program_percentage.humanities | program_percentage.library | program_percentage.biological | program_percentage.mathematics | program_percentage.military | program_percentage.multidiscipline | program_percentage.parks_recreation_fitness | program_percentage.philosophy_religious | program_percentage.theology_religious_vocation | program_percentage.physical_science | program_percentage.science_technology | program_percentage.psychology | program_percentage.security_law_enforcement | program_percentage.public_administration_social_service | program_percentage.social_science | program_percentage.construction | program_percentage.mechanic_repair_technology | program_percentage.precision_production | program_percentage.transportation | program_percentage.visual_performing | program_percentage.health | program_percentage.business_marketing | program_percentage.history | program.certificate_lt_1_yr.agriculture | program.certificate_lt_2_yr.agriculture | program.assoc.agriculture | program.certificate_lt_4_yr.agriculture | program.bachelors.agriculture | program.certificate_lt_1_yr.resources | program.certificate_lt_2_yr.resources | program.assoc.resources | program.certificate_lt_4_yr.resources | program.bachelors.resources | program.certificate_lt_1_yr.architecture | program.certificate_lt_2_yr.architecture | program.assoc.architecture | program.certificate_lt_4_yr.architecture | program.bachelors.architecture | program.certificate_lt_1_yr.ethnic_cultural_gender | program.certificate_lt_2_yr.ethnic_cultural_gender | program.assoc.ethnic_cultural_gender | program.certificate_lt_4_yr.ethnic_cultural_gender | program.bachelors.ethnic_cultural_gender | program.certificate_lt_1_yr.communication | program.certificate_lt_2_yr.communication | program.assoc.communication | program.certificate_lt_4_yr.communication | program.bachelors.communication | program.certificate_lt_1_yr.communications_technology | program.certificate_lt_2_yr.communications_technology | program.assoc.communications_technology | program.certificate_lt_4_yr.communications_technology | program.bachelors.communications_technology | program.certificate_lt_1_yr.computer | program.certificate_lt_2_yr.computer | program.assoc.computer | program.certificate_lt_4_yr.computer | program.bachelors.computer | program.certificate_lt_1_yr.personal_culinary | program.certificate_lt_2_yr.personal_culinary | program.assoc.personal_culinary | program.certificate_lt_4_yr.personal_culinary | program.bachelors.personal_culinary | program.certificate_lt_1_yr.education | program.certificate_lt_2_yr.education | program.assoc.education | program.certificate_lt_4_yr.education | program.bachelors.education | program.certificate_lt_1_yr.engineering | program.certificate_lt_2_yr.engineering | program.assoc.engineering | program.certificate_lt_4_yr.engineering | program.bachelors.engineering | program.certificate_lt_1_yr.engineering_technology | program.certificate_lt_2_yr.engineering_technology | program.assoc.engineering_technology | program.certificate_lt_4_yr.engineering_technology | program.bachelors.engineering_technology | program.certificate_lt_1_yr.language | program.certificate_lt_2_yr.language | program.assoc.language | program.certificate_lt_4_yr.language | program.bachelors.language | program.certificate_lt_1_yr.family_consumer_science | program.certificate_lt_2_yr.family_consumer_science | program.assoc.family_consumer_science | program.certificate_lt_4_yr.family_consumer_science | program.bachelors.family_consumer_science | program.certificate_lt_1_yr.legal | program.certificate_lt_2_yr.legal | program.assoc.legal | program.certificate_lt_4_yr.legal | program.bachelors.legal | program.certificate_lt_1_yr.english | program.certificate_lt_2_yr.english | program.assoc.english | program.certificate_lt_4_yr.english | program.bachelors.english | program.certificate_lt_1_yr.humanities | program.certificate_lt_2_yr.humanities | program.assoc.humanities | program.certificate_lt_4_yr.humanities | program.bachelors.humanities | program.certificate_lt_1_yr.library | program.certificate_lt_2_yr.library | program.assoc.library | program.certificate_lt_4_yr.library | program.bachelors.library | program.certificate_lt_1_yr.biological | program.certificate_lt_2_yr.biological | program.assoc.biological | program.certificate_lt_4_yr.biological | program.bachelors.biological | program.certificate_lt_1_yr.mathematics | program.certificate_lt_2_yr.mathematics | program.assoc.mathematics | program.certificate_lt_4_yr.mathematics | program.bachelors.mathematics | program.certificate_lt_1_yr.military | program.certificate_lt_2_yr.military | program.assoc.military | program.certificate_lt_4_yr.military | program.bachelors.military | program.certificate_lt_1_yr.multidiscipline | program.certificate_lt_2_yr.multidiscipline | program.assoc.multidiscipline | program.certificate_lt_4_yr.multidiscipline | program.bachelors.multidiscipline | program.certificate_lt_1_yr.parks_recreation_fitness | program.certificate_lt_2_yr.parks_recreation_fitness | program.assoc.parks_recreation_fitness | program.certificate_lt_4_yr.parks_recreation_fitness | program.bachelors.parks_recreation_fitness | program.certificate_lt_1_yr.philosophy_religious | program.certificate_lt_2_yr.philosophy_religious | program.assoc.philosophy_religious | program.certificate_lt_4_yr.philosophy_religious | program.bachelors.philosophy_religious | program.certificate_lt_1_yr.theology_religious_vocation | program.certificate_lt_2_yr.theology_religious_vocation | program.assoc.theology_religious_vocation | program.certificate_lt_4_yr.theology_religious_vocation | program.bachelors.theology_religious_vocation | program.certificate_lt_1_yr.physical_science | program.certificate_lt_2_yr.physical_science | program.assoc.physical_science | program.certificate_lt_4_yr.physical_science | program.bachelors.physical_science | program.certificate_lt_1_yr.science_technology | program.certificate_lt_2_yr.science_technology | program.assoc.science_technology | program.certificate_lt_4_yr.science_technology | program.bachelors.science_technology | program.certificate_lt_1_yr.psychology | program.certificate_lt_2_yr.psychology | program.assoc.psychology | program.certificate_lt_4_yr.psychology | program.bachelors.psychology | program.certificate_lt_1_yr.security_law_enforcement | program.certificate_lt_2_yr.security_law_enforcement | program.assoc.security_law_enforcement | program.certificate_lt_4_yr.security_law_enforcement | program.bachelors.security_law_enforcement | program.certificate_lt_1_yr.public_administration_social_service | program.certificate_lt_2_yr.public_administration_social_service | program.assoc.public_administration_social_service | program.certificate_lt_4_yr.public_administration_social_service | program.bachelors.public_administration_social_service | program.certificate_lt_1_yr.social_science | program.certificate_lt_2_yr.social_science | program.assoc.social_science | program.certificate_lt_4_yr.social_science | program.bachelors.social_science | program.certificate_lt_1_yr.construction | program.certificate_lt_2_yr.construction | program.assoc.construction | program.certificate_lt_4_yr.construction | program.bachelors.construction | program.certificate_lt_1_yr.mechanic_repair_technology | program.certificate_lt_2_yr.mechanic_repair_technology | program.assoc.mechanic_repair_technology | program.certificate_lt_4_yr.mechanic_repair_technology | program.bachelors.mechanic_repair_technology | program.certificate_lt_1_yr.precision_production | program.certificate_lt_2_yr.precision_production | program.assoc.precision_production | program.certificate_lt_4_yr.precision_production | program.bachelors.precision_production | program.certificate_lt_1_yr.transportation | program.certificate_lt_2_yr.transportation | program.assoc.transportation | program.certificate_lt_4_yr.transportation | program.bachelors.transportation | program.certificate_lt_1_yr.visual_performing | program.certificate_lt_2_yr.visual_performing | program.assoc.visual_performing | program.certificate_lt_4_yr.visual_performing | program.bachelors.visual_performing | program.certificate_lt_1_yr.health | program.certificate_lt_2_yr.health | program.assoc.health | program.certificate_lt_4_yr.health | program.bachelors.health | program.certificate_lt_1_yr.business_marketing | program.certificate_lt_2_yr.business_marketing | program.assoc.business_marketing | program.certificate_lt_4_yr.business_marketing | program.bachelors.business_marketing | program.certificate_lt_1_yr.history | program.certificate_lt_2_yr.history | program.assoc.history | program.certificate_lt_4_yr.history | program.bachelors.history | online_only | size | demographics.race_ethnicity.white | demographics.race_ethnicity.black | demographics.race_ethnicity.hispanic | demographics.race_ethnicity.asian | demographics.race_ethnicity.aian | demographics.race_ethnicity.nhpi | demographics.race_ethnicity.two_or_more | demographics.race_ethnicity.non_resident_alien | demographics.race_ethnicity.unknown | part_time_share | operating | avg_net_price.public | avg_net_price.private | net_price.public.by_income_level.0-30000 | net_price.public.by_income_level.30001-48000 | net_price.public.by_income_level.48001-75000 | net_price.public.by_income_level.75001-110000 | net_price.public.by_income_level.110001-plus | net_price.private.by_income_level.0-30000 | net_price.private.by_income_level.30001-48000 | net_price.private.by_income_level.48001-75000 | net_price.private.by_income_level.75001-110000 | net_price.private.by_income_level.110001-plus | net_price.public.by_income_level.0-48000 | net_price.private.by_income_level.0-48000 | net_price.public.by_income_level.30001-75000 | net_price.private.by_income_level.30001-75000 | net_price.public.by_income_level.75000-plus | net_price.private.by_income_level.75000-plus | title_iv.public.all | title_iv.private.all | title_iv.public.by_income_level.0-30000 | title_iv.public.by_income_level.30001-48000 | title_iv.public.by_income_level.48001-75000 | title_iv.public.by_income_level.75001-110000 | title_iv.public.by_income_level.110001-plus | title_iv.private.by_income_level.0-30000 | title_iv.private.by_income_level.30001-48000 | title_iv.private.by_income_level.48001-75000 | title_iv.private.by_income_level.75001-110000 | title_iv.private.by_income_level.110001-plus | attendance.academic_year | attendance.program_year | tuition.in_state | tuition.out_of_state | tuition.program_year | tuition_revenue_per_fte | instructional_expenditure_per_fte | faculty_salary | ft_faculty_rate | pell_grant_rate | completion_rate_4yr_150nt | completion_rate_less_than_4yr_150nt | completion_rate_4yr_150nt_pooled | completion_rate_less_than_4yr_150nt_pooled | pooled_yrs_used | share_first.time_full.time | completion_cohort_4yr_150nt | completion_cohort_less_than_4yr_150nt | completion_cohort_4yr_150nt_pooled | completion_cohort_less_than_4yr_150nt_pooled | completion_rate_4yr_150_white | completion_rate_4yr_150_black | completion_rate_4yr_150_hispanic | completion_rate_4yr_150_asian | completion_rate_4yr_150_aian | completion_rate_4yr_150_nhpi | completion_rate_4yr_150_2ormore | completion_rate_4yr_150_nonresident.alien | completion_rate_4yr_150_race.unknown | completion_rate_l4yr_150_white | completion_rate_l4yr_150_black | completion_rate_l4yr_150_hispanic | completion_rate_l4yr_150_asian | completion_rate_l4yr_150_aian | completion_rate_l4yr_150_nhpi | completion_rate_l4yr_150_2ormore | completion_rate_l4yr_150_nonresident.alien | completion_rate_l4yr_150_race.unknown | retention_rate.four_year.full_time | retention_rate.lt_four_year.full_time | retention_rate.four_year.part_time | retention_rate.lt_four_year.part_time | federal_loan_rate | share_25_older | 3_yr_default_rate | repayment_cohort.3_year_declining_balance | 3_yr_repayment.completers_rate | 3_yr_repayment.noncompleters_rate | 3_yr_repayment.income.0_30000 | 3_yr_repayment.income.30000_75000 | 3_yr_repayment.income.greater_than_75000 | 3_yr_repayment.dependent_students_rate | 3_yr_repayment.independent_students_rate | 3_yr_repayment.pell_grant_rate | 3_yr_repayment.no_pell_grant_rate | 3_yr_repayment.female_students_rate | 3_yr_repayment.male_students_rate | 3_yr_repayment.first_generation_students_rate | 3_yr_repayment.non_first_generation_students_rate | repayment_cohort.5_year_declining_balance | 5_yr_repayment.completers_rate | 5_yr_repayment.noncompleters_rate | 5_yr_repayment.income.0_30000 | 5_yr_repayment.income.30000_75000 | 5_yr_repayment.income.greater_than_75000 | 5_yr_repayment.dependent_students_rate | 5_yr_repayment.independent_students_rate | 5_yr_repayment.pell_grant_rate | 5_yr_repayment.no_pell_grant_rate | 5_yr_repayment.female_students_rate | 5_yr_repayment.male_students_rate | 5_yr_repayment.first_generation_students_rate | 5_yr_repayment.non_first_generation_students_rate | repayment_cohort.7_year_declining_balance | 7_yr_repayment.completers_rate | 7_yr_repayment.noncompleters_rate | 7_yr_repayment.income.0_30000 | 7_yr_repayment.income.30000_75000 | 7_yr_repayment.income.greater_than_75000 | 7_yr_repayment.dependent_students_rate | 7_yr_repayment.independent_students_rate | 7_yr_repayment.pell_grant_rate | 7_yr_repayment.no_pell_grant_rate | 7_yr_repayment.female_students_rate | 7_yr_repayment.male_students_rate | 7_yr_repayment.first_generation_students_rate | 7_yr_repayment.non_first_generation_students_rate | share_lowincome.0_30000 | share_independent_students | share_dependent_lowincome.0_300000 | share_independent_lowincome.0_30000 | share_firstgeneration | share_middleincome.30001_48000 | share_middleincome.48001_75000 | share_highincome.75001_110000 | share_highincome.110001plus | share_dependent_middleincome.300001_48000 | share_dependent_middleincome.48001_75000 | share_dependent_highincome.75001_110000 | share_dependent_highincome.110001plus | share_independent_middleincome.30001_48000 | share_independent_middleincome.48001_75000 | share_independent_highincome.75001_110000 | share_independent_highincome.110001plus | share_firstgeneration_parents.middleschool | share_firstgeneration_parents.highschool | share_firstgeneration_parents.somecollege | fafsa_sent.2_college_allyrs | fafsa_sent.3_college_allyrs | fafsa_sent.4_college_allyrs | fafsa_sent.5plus_college_allyrs | avg_dependent_income.2014dollars | avg_independent_income.2014dollars | loan_principal | median_debt.completers.overall | median_debt.noncompleters | median_debt.income.0_30000 | median_debt.income.30001_75000 | median_debt.income.greater_than_75000 | median_debt.dependent_students | median_debt.independent_students | median_debt.pell_grant | median_debt.no_pell_grant | median_debt.female_students | median_debt.male_students | median_debt.first_generation_students | median_debt.non_first_generation_students | median_debt.number.overall | median_debt.number.completers | median_debt.number.noncompleters | median_debt.number.income.0_30000 | median_debt.number.income.30001_75000 | median_debt.number.income.greater_than_75000 | median_debt.number.dependent_students | median_debt.number.independent_students | median_debt.number.pell_grant | median_debt.number.no_pell_grant | median_debt.number.female_students | median_debt.number.male_students | median_debt.number.first_generation_students | median_debt.number.non_first_generation_students | median_debt.completers.monthly_payments | cumulative_debt.number | cumulative_debt.90th_percentile | cumulative_debt.75th_percentile | cumulative_debt.25th_percentile | cumulative_debt.10th_percentile | family_income.overall | family_income.dependent_students | family_income.independent_students | valid_dependency_status | parents_education_level | FAFSA_applications | 3_yr_repayment.overall | 3_yr_repayment.completers | 3_yr_repayment.noncompleters | 3_yr_repayment.low_income | 3_yr_repayment.middle_income | 3_yr_repayment.high_income | 3_yr_repayment.dependent_students | 3_yr_repayment.independent_students | 3_yr_repayment.pell_grant | 3_yr_repayment.no_pell_grant | 3_yr_repayment.female_students | 3_yr_repayment.male_students | 3_yr_repayment.first_generation_students | 3_yr_repayment.non_first_generation_students | 5_yr_repayment.overall | 5_yr_repayment.completers | 5_yr_repayment.noncompleters | 5_yr_repayment.low_income | 5_yr_repayment.middle_income | 5_yr_repayment.high_income | 5_yr_repayment.dependent_students | 5_yr_repayment.independent_students | 5_yr_repayment.pell_grant | 5_yr_repayment.no_pell_grant | 5_yr_repayment.female_students | 5_yr_repayment.male_students | 5_yr_repayment.first_generation_students | 5_yr_repayment.non_first_generation_students | 7_yr_repayment.overall | 7_yr_repayment.completers | 7_yr_repayment.noncompleters | 7_yr_repayment.low_income | 7_yr_repayment.middle_income | 7_yr_repayment.high_income | 7_yr_repayment.dependent_students | 7_yr_repayment.independent_students | 7_yr_repayment.pell_grant | 7_yr_repayment.no_pell_grant | 7_yr_repayment.female_students | 7_yr_repayment.male_students | 7_yr_repayment.first_generation_students | 7_yr_repayment.non_first_generation_students | students_with_any_loan | students_with_pell_grant | demographics.age_entry | demographics.female_share | demographics.married | demographics.dependent | demographics.veteran | demographics.first_generation | demographics.avg_family_income | demographics.median_family_income | demographics.avg_family_income_independents | median_debt_suppressed.overall | median_debt_suppressed.completers.overall | median_debt_suppressed.completers.monthly_payments | 3_yr_repayment_suppressed.overall | 3_yr_repayment_suppressed.income.low_income | 3_yr_repayment_suppressed.income.middle_income | 3_yr_repayment_suppressed.income.high_income | 3_yr_repayment_suppressed.completers | 3_yr_repayment_suppressed.non_completers | 3_yr_repayment_suppressed.dependent_students | 3_yr_repayment_suppressed.independent_students | 3_yr_repayment_suppressed.pell_grant | 3_yr_repayment_suppressed.no_pell_grant | 3_yr_repayment_suppressed.female_students | 3_yr_repayment_suppressed.male_students | 3_yr_repayment_suppressed.first_generation_students | 3_yr_repayment_suppressed.non_first_generation_students | rate_suppressed.lt_four_year_150percent | rate_suppressed.four_year | rate_suppressed.lt_four_year | rate_suppressed.four_year_200percent | alias | completion_rate_4yr_100nt | completion_cohort_4yr_100nt | completion_rate_less_than_4yr_100nt | completion_cohort_less_than_4yr_100nt | transfer_rate.4yr.full_time | transfer_rate.cohort_4yr.full_time | transfer_rate.less_than_4yr.full_time | transfer_rate.cohort_less_than_4yr.full_time | institutional_characteristics.level | demographics.men | demographics.women | 3_yr_default_rate_denom | title_iv.approval_date | completion_cohort_4yr_150_white | completion_cohort_4yr_150_black | completion_cohort_4yr_150_hispanic | completion_cohort_4yr_150_asian | completion_cohort_4yr_150_aian | completion_cohort_4yr_150_nhpi | completion_cohort_4yr_150_2ormore | completion_cohort_4yr_150_nonresident.alien | completion_cohort_4yr_150_race.unknown | completion_cohort_less_than_4yr_150_white | completion_cohort_less_than_4yr_150_black | completion_cohort_less_than_4yr_150_hispanic | completion_cohort_less_than_4yr_150_asian | completion_cohort_less_than_4yr_150_aian | completion_cohort_less_than_4yr_150_nhpi | completion_cohort_less_than_4yr_150_2ormore | completion_cohort_less_than_4yr_150_nonresident.alien | completion_cohort_less_than_4yr_150_race.unknown | undergrads_with_pell_grant_or_federal_student_loan | open_admissions_policy | undergrads_non_degree_seeking | grad_students | accreditor_code | outcome_cohort.full_time.first_time.6yr | outcome_percentage.full_time.first_time.6yr.award | outcome_cohort.full_time.first_time.8yr | outcome_percentage.full_time.first_time.8yr.award | outcome_percentage.full_time.first_time.8yr.still_enrolled | outcome_percentage.full_time.first_time.8yr.transfer | outcome_percentage.full_time.first_time.8yr.unknown | outcome_cohort.part_time.first_time.6yr | outcome_percentage.part_time.first_time.6yr.award | outcome_cohort.part_time.first_time.8yr | outcome_percentage.part_time.first_time.8yr.award | outcome_percentage.part_time.first_time.8yr.still_enrolled | outcome_percentage.part_time.first_time.8yr.transfer | outcome_percentage.part_time.first_time.8yr.unknown | outcome_cohort.full_time.not_first_time.6yr | outcome_percentage.full_time.not_first_time.6yr.award | outcome_cohort.full_time.not_first_time.8yr | outcome_percentage.full_time.not_first_time.8yr.award | outcome_percentage.full_time.not_first_time.8yr.still_enrolled | outcome_percentage.full_time.not_first_time.8yr.transfer | outcome_percentage.full_time.not_first_time.8yr.unknown | outcome_cohort.part_time.not_first_time.6yr | outcome_percentage.part_time.not_first_time.6yr.award | outcome_cohort.part_time.not_first_time.8yr | outcome_percentage.part_time.not_first_time.8yr.award | outcome_percentage.part_time.not_first_time.8yr.still_enrolled | outcome_percentage.part_time.not_first_time.8yr.transfer | outcome_percentage.part_time.not_first_time.8yr.unknown | |
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
1 | 100654 | 100200 | 1002 | Alabama A & M University | Normal | AL | 35762 | Southern Association of Colleges and Schools Commission on Colleges | www.aamu.edu/ | www2.aamu.edu/scripts/netpricecalc/npcalc.htm | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Midsize (population of at least 100,000 but less than 250,000) | 34.783368 | -86.568502 | Master's Colleges & Universities: Larger Programs | Four-year, full-time, inclusive, lower transfer-in | Four-year, medium, primarily residential | Yes | No | No | No | No | No | No | No | No | 0.6538 | 0.65384128591317 | 383 | 470 | 360 | 480 | 370 | 457 | 427 | 420 | 414 | 16 | 19 | 14 | 20 | 15 | 18 | 18 | 17 | 17 | 850 | 850 | 0.0446 | 0.0023 | 0.0094 | 0 | 0 | 0.0164 | 0.0634 | 0 | 0.1268 | 0.1432 | 0.0587 | 0 | 0.0188 | 0 | 0.0235 | 0.0423 | 0 | 0.1009 | 0.0094 | 0 | 0 | 0 | 0 | 0 | 0.0188 | 0 | 0.0282 | 0.0282 | 0.0516 | 0.0399 | 0 | 0 | 0 | 0 | 0.0258 | 0 | 0.1479 | 0 | Program not offered | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | Not distance-education only | 4505 | 0.034 | 0.9216 | 0.0058 | 0.0018 | 0.0022 | 0.0018 | 0 | 0.0062 | 0.0266 | 0.0626 | Currently certified as operating | 13435 | 13075 | 12458 | 15857 | 16022 | 14646 | 12945 | 13718 | 15632 | 743 | 485 | 129 | 76 | 38 | 15 | 20809 | 9366 | 17136 | 9657 | 7941 | 7017 | 0.7096 | 0.7249 | 0.3081 | 0.3303 | 2 | 0.8773 | 1042 | 2086 | 0.375 | 0.3091 | 0 | 0 | 0.3333 | 0 | 0.5779 | 0.3077 | 0.8159 | 0.0877 | 0.165 | 0.2458495231 | 0.4110512129 | 0.1871708952 | 0.2246082414 | 0.2721518987 | 0.2955974843 | 0.2521994135 | 0.2117117117 | 0.2326732673 | 0.3243243243 | 0.2457221081 | 0.2459854015 | 0.2376325088 | 0.2513243084 | 0.32798574 | 0.477631579 | 0.251347709 | 0.322172619 | 0.331825038 | 0.350210971 | 0.329880891 | 0.31629393 | 0.315959162 | 0.386422977 | 0.340535869 | 0.314627415 | 0.327334083 | 0.328413284 | 0.381348511 | 0.579330422 | 0.296180338 | 0.374553252 | 0.376146789 | 0.437229437 | 0.384535548 | 0.364145658 | 0.370547581 | 0.431761787 | 0.416385135 | 0.343636364 | 0.368965517 | 0.388967468 | 0.6325957148 | 0.1131015104 | 0.5932673267 | 0.9409937888 | 0.3887357227 | 0.172110994 | 0.0994028802 | 0.0579557429 | 0.0379346681 | 0.0192989366 | 0.3694367861 | 0.6112642773 | 0.7232174218 | 0.5672637864 | 0.4436248683 | 0.3473832104 | 33295 | 8487 | 14600 | 35000 | 9500 | 14457 | 15000 | 14250 | 14250 | 18998 | 15500 | 9500 | 16000 | 13750 | 14307.5 | 14953 | 3080 | 743 | 2347 | 1938 | 829 | 313 | 2652 | 428 | 2710 | 370 | 1573 | 1507 | 1182 | 1898 | 361.891446885773 | 3080 | 48750 | 32704 | 5500 | 3935 | 2847 | 2525 | 322 | 2847 | 2539 | 2847 | 2831 | 742 | 2089 | 1723 | 790 | 318 | 2387 | 444 | 2424 | 407 | 1461 | 1370 | 1132 | 1699 | 2244 | 760 | 1484 | 1344 | 663 | 237 | 1931 | 313 | 1861 | 383 | 1157 | 1087 | 889 | 1355 | 2284 | 687 | 1597 | 1399 | 654 | 231 | 1927 | 357 | 1881 | 403 | 1184 | 1100 | 870 | 1414 | 0.8963821567 | 0.8609062171 | 20 | 0.5472427116 | 0.0108886547 | 0.8868984896 | 0.0042149631 | 0.3887357227 | 30489 | 21429 | 8487 | 14600 | 35000 | 361.891446885773 | 0.2458495231 | 0.2246082414 | 0.2721518987 | 0.2955974843 | 0.4110512129 | 0.1871708952 | 0.2521994135 | 0.2117117117 | 0.2326732673 | 0.3243243243 | 0.2457221081 | 0.2459854015 | 0.2376325088 | 0.2513243084 | 0.3303 | 0.3335 | AAMU | 0.1104 | 1042 | 0.4012 | 1042 | 4-year | 0.4617 | 0.5383 | 1812 | 12/12/1965 | 24 | 1006 | 3 | 3 | 3 | 0 | 0 | 0 | 3 | 4210 | No | 1123 | SACSCC | 1044 | 0.3525 | 1044 | 0.3755 | 0 | 0.2213 | 0.4033 | 2 | 0 | 2 | 0 | 0 | 0 | 1 | 110 | 0.4182 | 110 | 0.4364 | 0 | 0.1727 | 0.3909 | 16 | 0.3125 | 16 | 0.3125 | 0 | 0 | 0.6875 | |||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
2 | 100663 | 105200 | 1052 | University of Alabama at Birmingham | Birmingham | AL | 35294-0110 | Southern Association of Colleges and Schools Commission on Colleges | www.uab.edu | uab.studentaidcalculator.com/survey.aspx | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Midsize (population of at least 100,000 but less than 250,000) | 33.50223 | -86.80917 | Doctoral Universities: Highest Research Activity | Four-year, medium full-time , selective, higher transfer-in | Four-year, large, primarily nonresidential | No | No | No | No | No | No | No | No | No | 0.6043 | 0.60427528675703 | 520 | 630 | 520 | 668 | 575 | 594 | 22 | 28 | 22 | 30 | 19 | 26 | 25 | 26 | 23 | 1147 | 1147 | 0 | 0 | 0 | 0.0009 | 0.0426 | 0 | 0.0133 | 0 | 0.0815 | 0.0577 | 0 | 0.0069 | 0 | 0 | 0.0192 | 0.0179 | 0 | 0.0715 | 0.0124 | 0 | 0 | 0 | 0.0073 | 0 | 0.0174 | 0 | 0.087 | 0.0366 | 0.0238 | 0.0408 | 0 | 0 | 0 | 0 | 0.0376 | 0.2231 | 0.1837 | 0.0188 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 1 | 0 | 1 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | Not distance-education only | 11269 | 0.5863 | 0.2541 | 0.0317 | 0.0595 | 0.0023 | 0.0006 | 0.0389 | 0.0181 | 0.0085 | 0.2671 | Currently certified as operating | 16023 | 13614 | 14746 | 17601 | 18873 | 18482 | 13942 | 16112 | 18681 | 955 | 359 | 146 | 134 | 161 | 155 | 22232 | 7766 | 17654 | 10263 | 17548 | 10221 | 0.9081 | 0.3505 | 0.5462 | 0.5504 | 2 | 0.5349 | 1494 | 2740 | 0.5536 | 0.4721 | 0.5946 | 0.7722 | 0.5 | 1 | 0.7222 | 0.6875 | 0.4146 | 0.7864 | 0.6071 | 0.5218 | 0.2363 | 0.053 | 0.5199110572 | 0.6246013667 | 0.4364098837 | 0.4671081678 | 0.5268608414 | 0.6156552331 | 0.5471639951 | 0.4679976512 | 0.4749426793 | 0.5923970433 | 0.5080163471 | 0.5413363533 | 0.5110990796 | 0.5251612903 | 0.57794584 | 0.673230442 | 0.497297297 | 0.529055078 | 0.594090202 | 0.669064748 | 0.605555556 | 0.524660472 | 0.536764706 | 0.639006663 | 0.564189189 | 0.603484321 | 0.574983628 | 0.57970451 | 0.633903921 | 0.756722151 | 0.540776699 | 0.583792723 | 0.66917923 | 0.713355049 | 0.641120725 | 0.619246862 | 0.582528736 | 0.711126469 | 0.619325281 | 0.662571663 | 0.622800845 | 0.64107224 | 0.450312437 | 0.3297722233 | 0.3590977444 | 0.6356968215 | 0.3564593301 | 0.1664986898 | 0.1370691393 | 0.1251763757 | 0.1209433582 | 0.1639097744 | 0.1551879699 | 0.1545864662 | 0.1672180451 | 0.1717603912 | 0.1002444988 | 0.065403423 | 0.0268948655 | 0.0230535015 | 0.3334058286 | 0.6435406699 | 0.516024995 | 0.2676879661 | 0.1664986898 | 0.1072364443 | 60411 | 29795 | 14250 | 21500 | 9500 | 14739 | 14250 | 14000 | 14818.5 | 13250 | 17000 | 11907 | 14750 | 13750 | 14100 | 14500 | 6086 | 2830 | 3279 | 2741 | 1849 | 1496 | 3994 | 2092 | 3747 | 2339 | 3949 | 2137 | 2159 | 3927 | 222.304745944118 | 6086 | 37500 | 26000 | 6250 | 3500 | 4961 | 3325 | 1636 | 4961 | 4598 | 4961 | 4947 | 2195 | 2752 | 2265 | 1545 | 1137 | 3244 | 1703 | 3053 | 1894 | 3181 | 1766 | 1847 | 3100 | 4099 | 1879 | 2220 | 1979 | 1286 | 834 | 2700 | 1399 | 2448 | 1651 | 2664 | 1435 | 1527 | 2572 | 3622 | 1562 | 2060 | 1814 | 1194 | 614 | 2427 | 1195 | 2175 | 1447 | 2401 | 1221 | 1421 | 2201 | 0.8718000403 | 0.6151985487 | 23 | 0.6369683532 | 0.1076395888 | 0.6702277767 | 0.0028220117 | 0.3564593301 | 50315 | 33731 | 29795 | 14250 | 21500 | 222.304745944118 | 0.5199110572 | 0.4671081678 | 0.5268608414 | 0.6156552331 | 0.6246013667 | 0.4364098837 | 0.5471639951 | 0.4679976512 | 0.4749426793 | 0.5923970433 | 0.5080163471 | 0.5413363533 | 0.5110990796 | 0.5251612903 | 0.5504 | 0.5444 | 0.3173 | 1494 | 0.2423 | 1494 | 4-year | 0.4116 | 0.5884 | 4159 | 12/1/1965 | 932 | 358 | 37 | 79 | 12 | 1 | 18 | 16 | 41 | 11679 | No | 242 | 6822 | SACSCC | 1246 | 0.5546 | 1245 | 0.5936 | 0.0169 | 0.2635 | 0.1261 | 30 | 0.2 | 30 | 0.3 | 0.1 | 0.2667 | 0.3333 | 686 | 0.6181 | 686 | 0.6327 | 0.0102 | 0.2187 | 0.1385 | 248 | 0.3589 | 248 | 0.4032 | 0.0444 | 0.25 | 0.3024 | |||||||||||||||||||||||||||||||||||||||||||||||||||||||||
3 | 100690 | 2503400 | 25034 | Amridge University | Montgomery | AL | 36117-3553 | Southern Association of Colleges and Schools Commission on Colleges | www.amridgeuniversity.edu | www2.amridgeuniversity.edu:9091/ | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Private nonprofit | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Midsize (population of at least 100,000 but less than 250,000) | 32.362609 | -86.17401 | Baccalaureate Colleges: Arts & Sciences Focus | Four-year, higher part-time | Four-year, very small, primarily nonresidential | No | Yes | No | No | No | No | No | No | No | Churches of Christ | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.2453 | 0 | 0 | 0.0566 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.1698 | 0 | 0 | 0 | 0.1321 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.3962 | 0 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | Distance-education only | 308 | 0.211 | 0.3409 | 0.0195 | 0 | 0 | 0.0032 | 0 | 0 | 0.4253 | 0.5714 | Currently certified as operating | 8862 | 8453 | 12133 | 8862 | 12133 | 9 | 8 | 1 | 0 | 0 | 0 | 12133 | 6900 | 6900 | 17071 | 7113 | 3217 | 1 | 0.7455 | 0.4 | 0.3333 | 4 | 0.2078 | 5 | 18 | 0.6667 | 0 | 0 | 0.6667 | 0.6667 | 0.8781 | 0.8571 | 0.1 | 0.2331002331 | 0.4576271186 | 0.1972972973 | 0.1638225256 | 0.325 | 0.2236503856 | 0.1966292135 | 0.4109589041 | 0.1895910781 | 0.30625 | 0.2248803828 | 0.2409090909 | 0.394230769 | 0.636363636 | 0.342412451 | 0.363636364 | 0.412844037 | 0.518518519 | 0.615384615 | 0.374125874 | 0.328888889 | 0.563218391 | 0.359550562 | 0.440298508 | 0.411428571 | 0.372262774 | 0.468531469 | 0.576923077 | 0.444444444 | 0.441176471 | 0.424390244 | 0.580246914 | 0.388235294 | 0.586206897 | 0.46 | 0.477941177 | 0.7912087912 | 0.8827838828 | 0.5285714286 | 0.1318681319 | 0.0366300366 | 0.0619047619 | 0.4666666667 | 0.4714285714 | 0.5347985348 | 0.293040293 | 0.1941391941 | 0.1098901099 | 25829 | 18765 | 11082 | 23000 | 9500 | 9500 | 15750 | 18469 | 5500 | 12500 | 10713 | 11791 | 12500 | 9500 | 10500 | 12500 | 369 | 41 | 331 | 253 | 97 | 19 | 36 | 333 | 329 | 40 | 216 | 153 | 205 | 164 | 237.814379382079 | 369 | 36000 | 23500 | 5063 | 3166 | 273 | 32 | 241 | 273 | 210 | 273 | 429 | 59 | 370 | 293 | 118 | 18 | 40 | 389 | 356 | 73 | 269 | 160 | 209 | 220 | 312 | 55 | 257 | 176 | 109 | 27 | 26 | 286 | 225 | 87 | 178 | 134 | 175 | 137 | 286 | 52 | 234 | 170 | 97 | 19 | 20 | 266 | 205 | 81 | 170 | 116 | 150 | 136 | 0.9413919414 | 0.8974358974 | 33 | 0.6043956044 | 0.2564102564 | 0.1172161172 | 0.5285714286 | 19593 | 14631 | 18765 | 11082 | 23000 | 237.814379382079 | 0.2331002331 | 0.1638225256 | 0.4576271186 | 0.1972972973 | 0.325 | 0.2236503856 | 0.1966292135 | 0.4109589041 | 0.1895910781 | 0.30625 | 0.2248803828 | 0.2409090909 | Southern Christian University |Regions University | 0 | 2 | 0.4 | 5 | 4-year | 0.4286 | 0.5714 | 380 | 3/26/1987 | 3 | 1 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 279 | Yes | 319 | SACSCC | 12 | 0.25 | 12 | 0.25 | 0.0833 | 0.3333 | 0.3333 | 8 | 0 | 8 | 0 | 0 | 1 | 0 | 80 | 0.5375 | 80 | 0.55 | 0.0125 | 0.4375 | 0 | 36 | 0.5 | 36 | 0.5278 | 0.0278 | 0.4444 | 0 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
4 | 100706 | 105500 | 1055 | University of Alabama in Huntsville | Huntsville | AL | 35899 | Southern Association of Colleges and Schools Commission on Colleges | www.uah.edu | finaid.uah.edu/ | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Midsize (population of at least 100,000 but less than 250,000) | 34.722818 | -86.63842 | Doctoral Universities: Highest Research Activity | Four-year, medium full-time , selective, higher transfer-in | Four-year, medium, primarily nonresidential | No | No | No | No | No | No | No | No | No | 0.812 | 0.81197097944377 | 520 | 650 | 550 | 680 | 585 | 615 | 24 | 30 | 24 | 32 | 24 | 29 | 27 | 28 | 27 | 1221 | 1221 | 0 | 0 | 0 | 0 | 0.0216 | 0 | 0.0315 | 0 | 0.0216 | 0.3027 | 0 | 0.0162 | 0 | 0 | 0.0126 | 0 | 0 | 0.0712 | 0.0198 | 0 | 0.0009 | 0 | 0.0072 | 0 | 0.0216 | 0 | 0.0171 | 0 | 0 | 0.0189 | 0 | 0 | 0 | 0 | 0.0288 | 0.1892 | 0.2072 | 0.0117 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | Not distance-education only | 5829 | 0.7024 | 0.123 | 0.0417 | 0.0381 | 0.013 | 0 | 0.0201 | 0.0317 | 0.03 | 0.1911 | Currently certified as operating | 18661 | 15252 | 17228 | 19178 | 20842 | 20848 | 15942 | 18376 | 20846 | 331 | 82 | 44 | 63 | 66 | 76 | 20999 | 9128 | 20622 | 8917 | 10619 | 9514 | 0.6173 | 0.3179 | 0.4935 | 0.4776 | 2 | 0.5852 | 774 | 1539 | 0.5214 | 0.3558 | 0.28 | 0.5333 | 0.3636 | 1 | 0.4375 | 0.6471 | 0.75 | 0.8025 | 0.4 | 0.4589 | 0.2255 | 0.052 | 0.5490029699 | 0.7098821396 | 0.4074960128 | 0.453358209 | 0.5943262411 | 0.6706896552 | 0.591492235 | 0.4771689498 | 0.4876140808 | 0.6634264885 | 0.511627907 | 0.5941893158 | 0.5152625153 | 0.566970091 | 0.581463415 | 0.762222222 | 0.44 | 0.493644068 | 0.629807692 | 0.690871369 | 0.601097179 | 0.549095607 | 0.504417671 | 0.700621118 | 0.528319406 | 0.64028777 | 0.580838323 | 0.581765557 | 0.637479085 | 0.813315927 | 0.506329114 | 0.553916005 | 0.684391081 | 0.778115502 | 0.679665738 | 0.574022346 | 0.561878952 | 0.759475219 | 0.606741573 | 0.674447174 | 0.615023474 | 0.649913345 | 0.4121435143 | 0.2943882245 | 0.2933507171 | 0.696875 | 0.3137931034 | 0.1494940202 | 0.1384544618 | 0.1375344986 | 0.1623735051 | 0.1479791395 | 0.1629726206 | 0.153125 | 0.0796875 | 0.0275862069 | 0.2862068966 | 0.6862068966 | 0.5262189512 | 0.2566697332 | 0.1435142594 | 0.0896964121 | 68369 | 25075 | 15000 | 23500 | 9377 | 16750 | 16083 | 12500 | 14403 | 17460.5 | 18555 | 11036.5 | 15958 | 14316 | 15250 | 15000 | 2527 | 1193 | 1351 | 1072 | 732 | 723 | 1635 | 892 | 1593 | 934 | 1236 | 1291 | 795 | 1732 | 242.984257194733 | 2527 | 38250 | 27750 | 6251 | 3500 | 2174 | 1534 | 640 | 2174 | 2030 | 2174 | 2357 | 1103 | 1254 | 1072 | 705 | 580 | 1481 | 876 | 1534 | 823 | 1290 | 1067 | 819 | 1538 | 2050 | 900 | 1150 | 944 | 624 | 482 | 1276 | 774 | 1245 | 805 | 1077 | 973 | 668 | 1382 | 1793 | 766 | 1027 | 881 | 583 | 329 | 1077 | 716 | 1107 | 686 | 979 | 814 | 639 | 1154 | 0.8541858326 | 0.5827966881 | 23 | 0.4779208832 | 0.1131554738 | 0.7056117755 | 0.0059797608 | 0.3137931034 | 55624 | 39100 | 25075 | 15000 | 23500 | 242.984257194733 | 0.5490029699 | 0.453358209 | 0.5943262411 | 0.6706896552 | 0.7098821396 | 0.4074960128 | 0.591492235 | 0.4771689498 | 0.4876140808 | 0.6634264885 | 0.511627907 | 0.5941893158 | 0.5152625153 | 0.566970091 | 0.4776 | 0.5212 | UAH |University of Alabama Huntsville | 0.1848 | 774 | 0.3178 | 774 | 4-year | 0.574 | 0.426 | 1464 | 12/1/1965 | 562 | 104 | 25 | 30 | 11 | 1 | 16 | 17 | 8 | 5618 | No | 184 | 1853 | SACSCC | 765 | 0.4614 | 765 | 0.5098 | 0.0196 | 0.3621 | 0.1085 | 31 | 0.1613 | 31 | 0.1613 | 0.0323 | 0.5161 | 0.2903 | 483 | 0.5217 | 483 | 0.5424 | 0.0124 | 0.3209 | 0.1242 | 131 | 0.3588 | 131 | 0.3664 | 0.0382 | 0.4351 | 0.1603 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
5 | 100724 | 100500 | 1005 | Alabama State University | Montgomery | AL | 36104-0271 | Southern Association of Colleges and Schools Commission on Colleges | www.alasu.edu | www.alasu.edu/cost-aid/forms/calculator/index.aspx | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Midsize (population of at least 100,000 but less than 250,000) | 32.364317 | -86.295677 | Master's Colleges & Universities: Larger Programs | Four-year, full-time, inclusive, lower transfer-in | Four-year, medium, primarily residential | Yes | No | No | No | No | No | No | No | No | 0.4639 | 0.46385830540928 | 370 | 450 | 360 | 460 | 410 | 410 | 16 | 19 | 14 | 19 | 15 | 17 | 18 | 17 | 16 | 844 | 844 | 0 | 0 | 0 | 0 | 0.0945 | 0 | 0.0567 | 0 | 0.1531 | 0 | 0 | 0 | 0 | 0 | 0.0284 | 0 | 0 | 0.0794 | 0.0302 | 0 | 0 | 0.0151 | 0 | 0 | 0.0265 | 0 | 0.0624 | 0.1342 | 0.0548 | 0.0151 | 0 | 0 | 0 | 0 | 0.0473 | 0.0926 | 0.0983 | 0.0113 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | Not distance-education only | 4740 | 0.0165 | 0.9251 | 0.0116 | 0.0032 | 0.0008 | 0.0006 | 0.0114 | 0.0209 | 0.0099 | 0.0766 | Currently certified as operating | 7400 | 7519 | 2611 | 9831 | 11446 | 12430 | 6928 | 5542 | 11763 | 570 | 438 | 60 | 41 | 21 | 10 | 18100 | 8720 | 15656 | 7717 | 7742 | 7940 | 0.6395 | 0.7567 | 0.2696 | 0.2663 | 2 | 0.866 | 1209 | 2539 | 0 | 0.2719 | 1 | 1 | 0 | 0 | 0.2667 | 0.6021 | 0.6316 | 0.7692 | 0.0974 | 0.167 | 0.1963538553 | 0.3545232274 | 0.1743275451 | 0.1732249786 | 0.2408111534 | 0.2831050228 | 0.2 | 0.179357022 | 0.1849269588 | 0.2994011976 | 0.2124600639 | 0.1757493188 | 0.1916376307 | 0.1998953428 | 0.265860039 | 0.43006993 | 0.248917749 | 0.244655582 | 0.307901907 | 0.328767123 | 0.264556467 | 0.27254509 | 0.253980288 | 0.340476191 | 0.273684211 | 0.255934718 | 0.266263238 | 0.265552995 | 0.318299805 | 0.499095841 | 0.278766311 | 0.285976169 | 0.39142462 | 0.418079096 | 0.320944638 | 0.304609218 | 0.308242379 | 0.381176471 | 0.328411105 | 0.305975522 | 0.309455587 | 0.325622776 | 0.6416231418 | 0.135797509 | 0.5946071595 | 0.9408284024 | 0.369258754 | 0.1647247891 | 0.1048613901 | 0.0490156689 | 0.03977501 | 0.0159163256 | 0.3533424284 | 0.630741246 | 0.6508638007 | 0.487344315 | 0.3680192849 | 0.2780233025 | 34650 | 6715 | 15274 | 32091 | 11500 | 15338 | 15757 | 15000 | 15000 | 18973 | 16143 | 9500 | 16639 | 14250 | 16000 | 15000 | 3394 | 861 | 2547 | 2295 | 848 | 251 | 2825 | 569 | 3085 | 309 | 2037 | 1357 | 1340 | 2054 | 331.813097771753 | 3394 | 44609 | 31250 | 7242 | 4340 | 2489 | 2151 | 338 | 2489 | 2199 | 2489 | 3346 | 409 | 2937 | 2338 | 789 | 219 | 2755 | 591 | 3012 | 334 | 1878 | 1468 | 1435 | 1911 | 3058 | 286 | 2772 | 2105 | 734 | 219 | 2559 | 499 | 2638 | 420 | 1710 | 1348 | 1322 | 1736 | 3082 | 553 | 2529 | 2182 | 723 | 177 | 2583 | 499 | 2657 | 425 | 1693 | 1389 | 1396 | 1686 | 0.8947368421 | 0.8726396143 | 20 | 0.612294094 | 0.0088388911 | 0.864202491 | 0.369258754 | 30857 | 21704 | 6715 | 15274 | 32091 | 331.813097771753 | 0.1963538553 | 0.1732249786 | 0.2408111534 | 0.2831050228 | 0.3545232274 | 0.1743275451 | 0.2 | 0.179357022 | 0.1849269588 | 0.2994011976 | 0.2124600639 | 0.1757493188 | 0.1916376307 | 0.1998953428 | 0.2663 | 0.2884 | 0.1216 | 1209 | 0 | 1209 | 4-year | 0.385 | 0.615 | 2196 | 12/1/1965 | 6 | 1177 | 0 | 1 | 1 | 3 | 0 | 6 | 15 | 4805 | No | 24 | 619 | SACSCC | 1330 | 0.2564 | 1330 | 0.2865 | 0.0165 | 0.5865 | 0.1105 | 49 | 0.0408 | 49 | 0.0408 | 0.0204 | 0.5918 | 0.3469 | 177 | 0.4181 | 177 | 0.435 | 0 | 0.3672 | 0.1977 | 36 | 0.2778 | 36 | 0.3056 | 0.0278 | 0.5833 | 0.0833 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
6 | 100751 | 105100 | 1051 | The University of Alabama | Tuscaloosa | AL | 35487-0166 | Southern Association of Colleges and Schools Commission on Colleges | www.ua.edu/ | financialaid.ua.edu/net-price-calculator/ | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Small (population less than 100,000) | 33.2144 | -87.545766 | Doctoral Universities: Higher Research Activity | Four-year, full-time, more selective, lower transfer-in | Four-year, large, primarily residential | No | No | No | No | No | No | No | No | No | 0.5359 | 0.53586719332651 | 490 | 600 | 490 | 610 | 480 | 600 | 545 | 550 | 540 | 22 | 31 | 22 | 32 | 21 | 29 | 7 | 8 | 27 | 27 | 25 | 8 | 1181 | 1181 | 0 | 0.0039 | 0 | 0.0035 | 0.107 | 0 | 0.0067 | 0 | 0.0696 | 0.0788 | 0 | 0.0071 | 0.0714 | 0 | 0.0164 | 0 | 0 | 0.0378 | 0.0083 | 0 | 0.0256 | 0 | 0.0041 | 0 | 0.0095 | 0 | 0.035 | 0.0286 | 0.0102 | 0.0364 | 0 | 0 | 0 | 0 | 0.0295 | 0.1065 | 0.2886 | 0.0155 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 1 | Not distance-education only | 31005 | 0.7807 | 0.1092 | 0.0399 | 0.0113 | 0.0035 | 0.0009 | 0.0271 | 0.0245 | 0.0029 | 0.0825 | Currently certified as operating | 20575 | 17263 | 19279 | 21309 | 22594 | 23599 | 17941 | 20312 | 23192 | 1282 | 377 | 191 | 198 | 209 | 307 | 27205 | 10170 | 25950 | 13373 | 10312 | 9710 | 0.7187 | 0.2009 | 0.6709 | 0.6638 | 2 | 0.8175 | 5062 | 10071 | 0.6894 | 0.5455 | 0.5926 | 0.6806 | 0.5294 | 0.78 | 0.8647 | 0.4667 | 0.4059 | 0.081 | 0.051 | 0.5911430119 | 0.707342566 | 0.4661231375 | 0.4599018003 | 0.5781902552 | 0.7163375224 | 0.6209822157 | 0.4454183267 | 0.496371553 | 0.7116923077 | 0.580741478 | 0.6035661218 | 0.5404411765 | 0.6123271889 | 0.63120684 | 0.75203252 | 0.497226075 | 0.521531101 | 0.635679742 | 0.73486626 | 0.661849139 | 0.481086324 | 0.545121951 | 0.731977159 | 0.624885914 | 0.638640429 | 0.590593266 | 0.649251959 | 0.704679595 | 0.827614379 | 0.573606272 | 0.615474113 | 0.712968654 | 0.80472103 | 0.732584843 | 0.572121212 | 0.638503086 | 0.784386617 | 0.700075358 | 0.710526316 | 0.67641196 | 0.71781414 | 0.269895059 | 0.1385002186 | 0.2152011166 | 0.6101026046 | 0.2329344729 | 0.1318320944 | 0.1380629646 | 0.1376257105 | 0.3225841714 | 0.1286638751 | 0.1379266591 | 0.1487120924 | 0.3694962568 | 0.1515390687 | 0.1389108129 | 0.0686661405 | 0.0307813733 | 0.0077492877 | 0.2251851852 | 0.7670655271 | 0.5435067774 | 0.3730870136 | 0.2714254482 | 0.1967643201 | 99525 | 30580 | 17500 | 23750 | 9472 | 17992 | 17469.5 | 17000 | 17500 | 16750 | 19750 | 14000 | 17750 | 16500 | 18250 | 17000 | 10093 | 5584 | 4552 | 3000 | 2710 | 4383 | 8461 | 1632 | 5388 | 4705 | 5912 | 4181 | 2629 | 7464 | 245.56919610106 | 10093 | 34500 | 27000 | 7500 | 4500 | 9148 | 7881 | 1267 | 9148 | 8775 | 9148 | 7384 | 3827 | 3557 | 2444 | 2155 | 2785 | 6129 | 1255 | 4134 | 3250 | 4019 | 3365 | 2176 | 5208 | 6082 | 3198 | 2884 | 2090 | 1861 | 2131 | 5051 | 1031 | 3280 | 2802 | 3287 | 2795 | 1871 | 4211 | 4744 | 2448 | 2296 | 1719 | 1627 | 1398 | 3919 | 825 | 2592 | 2152 | 2654 | 2090 | 1505 | 3239 | 0.9169217315 | 0.4676432007 | 21 | 0.607564495 | 0.053672934 | 0.8614997814 | 0.0030607783 | 0.2329344729 | 89976 | 64600 | 30580 | 17500 | 23750 | 245.56919610106 | 0.5911430119 | 0.4599018003 | 0.5781902552 | 0.7163375224 | 0.707342566 | 0.4661231375 | 0.6209822157 | 0.4454183267 | 0.496371553 | 0.7116923077 | 0.580741478 | 0.6035661218 | 0.5404411765 | 0.6123271889 | 0.6638 | 0.6883 | 0.4135 | 5062 | 0.2215 | 5062 | 4-year | 0.4525 | 0.5475 | 5325 | 12/1/1965 | 4221 | 550 | 135 | 72 | 34 | 0 | 0 | 50 | 0 | 30752 | No | 953 | 5140 | SACSCC | 5009 | 0.6566 | 5009 | 0.6782 | 0.006 | 0.2533 | 0.0625 | 82 | 0.3293 | 82 | 0.378 | 0.0122 | 0.3537 | 0.2561 | 1131 | 0.6746 | 1131 | 0.6852 | 0.0044 | 0.2069 | 0.1034 | 210 | 0.5476 | 210 | 0.5619 | 0.0095 | 0.2238 | 0.2048 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
7 | 100760 | 100700 | 1007 | Central Alabama Community College | Alexander City | AL | 35010 | Southern Association of Colleges and Schools Commission on Colleges | www.cacc.edu | www.cacc.edu/NetPriceCalculator/14-15/npcalc.html | 0 | Main campus | 1 | Predominantly associate's-degree granting | Associate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | Town: Distant (in urban cluster more than 10 miles and up to 35 miles from an urbanized area) | 32.924429 | -85.94653 | Associate's Colleges: High Transfer-Mixed Traditional/Nontraditional | Two-year, mixed part/full-time | Two-year, small | No | No | No | No | No | No | No | No | No | 0 | 0 | 0 | 0 | 0 | 0 | 0.0189 | 0.022 | 0 | 0 | 0.044 | 0 | 0 | 0 | 0 | 0.3742 | 0 | 0 | 0 | 0 | 0.0346 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0.022 | 0.0849 | 0 | 0 | 0.2453 | 0.1541 | 0 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 1 | 1 | 0 | 0 | 0 | 1 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 1 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 1 | 1 | 0 | 0 | 1 | 1 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 1 | 0 | 0 | 0 | 1 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | Not distance-education only | 1546 | 0.7141 | 0.26 | 0.0123 | 0.0045 | 0.0019 | 0 | 0.0032 | 0.0019 | 0.0019 | 0.3745 | Currently certified as operating | 5958 | 5180 | 5721 | 7518 | 9093 | 9834 | 5311 | 6425 | 9241 | 312 | 185 | 59 | 38 | 24 | 6 | 11475 | 4320 | 7770 | 2548 | 7288 | 5671 | 0.4602 | 0.5554 | 0.2122 | 0.1722 | 2 | 0.7656 | 476 | 1063 | 0.2324 | 0.1773 | 0 | 0 | 0 | 0 | 0.523 | 0.5397 | 0.3574 | 0.263 | 0.221 | 0.263502455 | 0.4081632653 | 0.2574595055 | 0.1946386946 | 0.3772893773 | 0.5714285714 | 0.3463035019 | 0.2033898305 | 0.2243528284 | 0.4916201117 | 0.2532239156 | 0.2872628726 | 0.2660427807 | 0.2594936709 | 0.345511482 | 0.543478261 | 0.32448037 | 0.254491018 | 0.521531101 | 0.641975309 | 0.44591029 | 0.279792746 | 0.28425096 | 0.615819209 | 0.337570622 | 0.368 | 0.343537415 | 0.348648649 | 0.42002442 | 0.536842105 | 0.404696133 | 0.35078534 | 0.569230769 | 0.62745098 | 0.495495496 | 0.368312757 | 0.36492891 | 0.607526882 | 0.419354839 | 0.422110553 | 0.407272727 | 0.446096654 | 0.6363636364 | 0.340034965 | 0.5337748344 | 0.8354755784 | 0.563976378 | 0.1695804196 | 0.111013986 | 0.0576923077 | 0.0253496503 | 0.2039735099 | 0.1028277635 | 0.0442913386 | 0.5196850394 | 0.436023622 | 0.4344405594 | 0.236013986 | 0.152972028 | 0.1022727273 | 34678 | 15553 | 6500 | 9388 | 6188 | 7000 | 6239 | 4703 | 4899 | 10450 | 6875 | 5000 | 7382 | 5500 | 7590 | 5682 | 949 | 109 | 842 | 620 | 219 | 110 | 492 | 457 | 795 | 154 | 665 | 284 | 530 | 419 | 97.0696258103897 | 949 | 25000 | 13288 | 3500 | 1757 | 1144 | 755 | 389 | 1144 | 1016 | 1144 | 1222 | 49 | 1173 | 858 | 273 | 91 | 514 | 708 | 1043 | 179 | 853 | 369 | 748 | 474 | 958 | 92 | 866 | 668 | 209 | 81 | 379 | 579 | 781 | 177 | 708 | 250 | 588 | 370 | 819 | 95 | 724 | 573 | 195 | 51 | 333 | 486 | 633 | 186 | 620 | 199 | 550 | 269 | 0.4388111888 | 0.8837412587 | 23 | 0.5935314685 | 0.0856643357 | 0.659965035 | 0.563976378 | 28175 | 20037 | 15553 | 6500 | 9388 | 97.0696258103897 | 0.263502455 | 0.1946386946 | 0.3772893773 | 0.5714285714 | 0.4081632653 | 0.2574595055 | 0.3463035019 | 0.2033898305 | 0.2243528284 | 0.4916201117 | 0.2532239156 | 0.2872628726 | 0.2660427807 | 0.2594936709 | 0.1722 | 0.1338 | 0.105 | 476 | 0.2017 | 476 | 2-year | 0.4017 | 0.5983 | 659 | 2/14/1969 | 327 | 141 | 3 | 0 | 3 | 0 | 0 | 1 | 1 | 1813 | Yes | 241 | SACSCC | 446 | 0.1861 | 446 | 0.204 | 0.0157 | 0.4036 | 0.3767 | 50 | 0 | 50 | 0 | 0.02 | 0.24 | 0.74 | 74 | 0.2297 | 74 | 0.2297 | 0 | 0.3784 | 0.3919 | 59 | 0.2542 | 59 | 0.2542 | 0 | 0.2203 | 0.5254 | |||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
8 | 100812 | 100800 | 1008 | Athens State University | Athens | AL | 35611 | Southern Association of Colleges and Schools Commission on Colleges | www.athens.edu | https://24.athens.edu/apex/prod8/f?p=174:1:3941357449598491 | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Bachelor's degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | Town: Fringe (in urban cluster up to 10 miles from an urbanized area) | 34.805625 | -86.96514 | Baccalaureate Colleges: Diverse Fields | Four-year, higher part-time | Four-year, small, primarily nonresidential | No | No | No | No | No | No | No | No | No | 0 | 0 | 0 | 0 | 0 | 0 | 0.0501 | 0 | 0.2303 | 0 | 0 | 0 | 0 | 0 | 0.0363 | 0.0551 | 0 | 0.015 | 0.0225 | 0 | 0.015 | 0.0088 | 0.01 | 0 | 0.005 | 0 | 0.0325 | 0.0263 | 0 | 0.0288 | 0 | 0 | 0 | 0 | 0.0263 | 0.01 | 0.4205 | 0.0075 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 1 | Not distance-education only | 2904 | 0.7817 | 0.1185 | 0.0189 | 0.0062 | 0.0152 | 0.0007 | 0.0189 | 0.0055 | 0.0344 | 0.5778 | Currently certified as operating | 6189 | 6741 | 7921 | 0.445 | 0.4233 | 0.6512 | 0.6774 | 0.053 | 0.4942462601 | 0.5736514523 | 0.3953488372 | 0.4256837099 | 0.5223420647 | 0.6532258065 | 0.6603773585 | 0.4491587418 | 0.450166113 | 0.5936329588 | 0.4660743134 | 0.564 | 0.4863636364 | 0.5023310023 | 0.5313118 | 0.599282297 | 0.447870778 | 0.446132597 | 0.585160202 | 0.68 | 0.675595238 | 0.490262489 | 0.470772443 | 0.635062612 | 0.514814815 | 0.57208238 | 0.53256705 | 0.529972752 | 0.598741149 | 0.721845319 | 0.428838951 | 0.525821596 | 0.640873016 | 0.796875 | 0.716783217 | 0.564467005 | 0.544619423 | 0.679764244 | 0.579741379 | 0.650145773 | 0.625592417 | 0.572100314 | 0.5099295324 | 0.7155669443 | 0.3153153153 | 0.5872873769 | 0.4655290102 | 0.1825752723 | 0.1633568225 | 0.0909673286 | 0.0531710442 | 0.1711711712 | 0.1936936937 | 0.1689189189 | 0.1509009009 | 0.1871083259 | 0.15129812 | 0.0599820949 | 0.0143240824 | 0.0395904437 | 0.4259385666 | 0.5344709898 | 0.5855221012 | 0.196668802 | 0.0781550288 | 0.0422805894 | 58970 | 30649 | 13250 | 18534 | 8974.5 | 13000 | 14076 | 12500 | 9856 | 14791.5 | 13959 | 12500 | 13745 | 12500 | 14166 | 12500 | 1785 | 881 | 926 | 871 | 608 | 306 | 443 | 1342 | 1249 | 536 | 1262 | 523 | 821 | 964 | 191.637030759455 | 1785 | 35000 | 25000 | 6340 | 3554 | 1561 | 444 | 1117 | 1561 | 1465 | 1561 | 1738 | 964 | 774 | 841 | 649 | 248 | 371 | 1367 | 1204 | 534 | 1238 | 500 | 880 | 858 | 1517 | 836 | 681 | 724 | 593 | 200 | 336 | 1181 | 958 | 559 | 1080 | 437 | 783 | 734 | 1271 | 737 | 534 | 639 | 504 | 128 | 286 | 985 | 762 | 509 | 928 | 343 | 633 | 638 | 0.7879564382 | 0.733504164 | 30 | 0.6867392697 | 0.3670723895 | 0.2844330557 | 0.4655290102 | 38704 | 28608 | 30649 | 13250 | 18534 | 191.637030759455 | 0.4942462601 | 0.4256837099 | 0.5223420647 | 0.6532258065 | 0.5736514523 | 0.3953488372 | 0.6603773585 | 0.4491587418 | 0.450166113 | 0.5936329588 | 0.4660743134 | 0.564 | 0.4863636364 | 0.5023310023 | 4-year | 0.3485 | 0.6515 | 959 | 12/1/1965 | 3128 | 137 | SACSCC | 0 | 0 | 0 | 0 | 414 | 0.6522 | 414 | 0.6618 | 0.0048 | 0.1981 | 0.1353 | 371 | 0.4528 | 371 | 0.4663 | 0.0081 | 0.2291 | 0.2965 | |||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
9 | 100830 | 831000 | 8310 | Auburn University at Montgomery | Montgomery | AL | 36117-3596 | Southern Association of Colleges and Schools Commission on Colleges | www.aum.edu | www.aum.edu/current-students/financial-information/net-price-calculator | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Midsize (population of at least 100,000 but less than 250,000) | 32.369939 | -86.177351 | Master's Colleges & Universities: Larger Programs | Four-year, medium full-time , selective, higher transfer-in | Four-year, medium, primarily nonresidential | No | No | No | No | No | No | No | No | No | 0.7871 | 0.78708901363271 | 450 | 520 | 470 | 540 | 485 | 505 | 19 | 23 | 19 | 25 | 17 | 22 | 21 | 22 | 20 | 990 | 990 | 0 | 0.0017 | 0 | 0 | 0.0588 | 0 | 0 | 0 | 0.079 | 0 | 0 | 0.0067 | 0 | 0 | 0.0319 | 0.037 | 0 | 0.0571 | 0.0067 | 0 | 0 | 0.0336 | 0 | 0 | 0.0235 | 0 | 0.0387 | 0.0471 | 0 | 0.0336 | 0 | 0 | 0 | 0 | 0.0286 | 0.2555 | 0.2471 | 0.0134 | Program not offered | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 2 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | Not distance-education only | 4142 | 0.5355 | 0.351 | 0.007 | 0.0241 | 0.0051 | 0.0017 | 0.0316 | 0.0316 | 0.0123 | 0.2569 | Currently certified as operating | 14176 | 12857 | 14215 | 15572 | 17266 | 16094 | 13210 | 14659 | 16734 | 409 | 211 | 74 | 36 | 48 | 40 | 18665 | 9350 | 20210 | 8039 | 6815 | 7588 | 0.9539 | 0.4373 | 0.2038 | 0.2115 | 2 | 0.5659 | 736 | 1447 | 0.2278 | 0.166 | 0.3 | 0.3 | 0.3333 | 0 | 0.1053 | 0.6463 | 0.4727 | 0.5584 | 0.2257 | 0.083 | 0.4162696959 | 0.6567967699 | 0.3262839879 | 0.3305785124 | 0.5111402359 | 0.5750636132 | 0.4377289377 | 0.3840513291 | 0.3560723514 | 0.5629722922 | 0.4036939314 | 0.4448441247 | 0.3777388256 | 0.4439546599 | 0.481514085 | 0.714932127 | 0.385332505 | 0.386484434 | 0.59379845 | 0.651612903 | 0.527736132 | 0.415778252 | 0.404605263 | 0.636968085 | 0.468289558 | 0.510548523 | 0.474758324 | 0.486204325 | 0.531395952 | 0.69435216 | 0.457358491 | 0.453356582 | 0.630550622 | 0.686635945 | 0.566493955 | 0.478543563 | 0.474178404 | 0.644067797 | 0.515843773 | 0.568421053 | 0.499381953 | 0.554561717 | 0.5425434584 | 0.2570905764 | 0.4759852217 | 0.7348754448 | 0.3906485671 | 0.1738334858 | 0.1193961574 | 0.0983531565 | 0.065873742 | 0.1828817734 | 0.1360837438 | 0.1476868327 | 0.0711743772 | 0.0231271996 | 0.3675213675 | 0.6093514329 | 0.5713632205 | 0.3504117109 | 0.2291857274 | 0.1463860933 | 44217 | 21935 | 10250 | 22192.5 | 7406.5 | 9842 | 10250 | 10975.5 | 9201 | 12500 | 10750 | 7537.5 | 10750 | 9500 | 11000 | 9500 | 2648 | 750 | 1910 | 1425 | 745 | 478 | 1811 | 837 | 1916 | 732 | 1783 | 865 | 1066 | 1582 | 229.465026714643 | 2648 | 37100 | 22053 | 4750 | 2750 | 2186 | 1624 | 562 | 2186 | 1989 | 2186 | 2729 | 743 | 1986 | 1573 | 763 | 393 | 1638 | 1091 | 1935 | 794 | 1895 | 834 | 1141 | 1588 | 2272 | 663 | 1609 | 1317 | 645 | 310 | 1334 | 938 | 1520 | 752 | 1561 | 711 | 931 | 1341 | 1927 | 602 | 1325 | 1147 | 563 | 217 | 1158 | 769 | 1278 | 649 | 1357 | 570 | 809 | 1118 | 0.8970722781 | 0.730558097 | 22 | 0.6838975297 | 0.0750228728 | 0.7429094236 | 0.005946935 | 0.3906485671 | 38489 | 26229 | 21935 | 10250 | 22192.5 | 229.465026714643 | 0.4162696959 | 0.3305785124 | 0.5111402359 | 0.5750636132 | 0.6567967699 | 0.3262839879 | 0.4377289377 | 0.3840513291 | 0.3560723514 | 0.5629722922 | 0.4036939314 | 0.4448441247 | 0.3777388256 | 0.4439546599 | 0.2115 | 0.3195 | AUM|Auburn University Montgomery|Auburn University at Montgomery|Auburn Montgomery | 0.0673 | 683 | 0.4769 | 736 | 4-year | 0.3595 | 0.6405 | 1776 | 1/1/1968 | 439 | 247 | 10 | 10 | 3 | 0 | 0 | 8 | 19 | 4377 | No | 115 | 662 | SACSCC | 711 | 0.2194 | 711 | 0.2461 | 0.0141 | 0.4824 | 0.2574 | 133 | 0.1128 | 133 | 0.1654 | 0.015 | 0.3233 | 0.4962 | 301 | 0.5748 | 301 | 0.5847 | 0.01 | 0.2193 | 0.186 | 117 | 0.3504 | 117 | 0.3846 | 0.0256 | 0.3248 | 0.265 | ||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||||
10 | 100858 | 100900 | 1009 | Auburn University | Auburn | AL | 36849 | Southern Association of Colleges and Schools Commission on Colleges | www.auburn.edu | www.auburn.edu/admissions/money-matters.html | 0 | Main campus | 1 | Predominantly bachelor's-degree granting | Graduate degree | Public | Alabama | Southeast (AL, AR, FL, GA, KY, LA, MS, NC, SC, TN, VA, WV) | City: Small (population less than 100,000) | 32.604685 | -85.482782 | Doctoral Universities: Higher Research Activity | Four-year, full-time, more selective, higher transfer-in | Four-year, large, primarily nonresidential | No | No | No | No | No | No | No | No | No | 0.7766 | 0.77660451220768 | 530 | 630 | 540 | 650 | 520 | 620 | 580 | 595 | 570 | 24 | 30 | 25 | 32 | 23 | 28 | 7 | 8 | 27 | 29 | 26 | 8 | 1218 | 1218 | 0.0433 | 0.0152 | 0.0175 | 0 | 0.0533 | 0 | 0.0066 | 0 | 0.0939 | 0.1741 | 0 | 0.0135 | 0.0331 | 0 | 0.0155 | 0 | 0 | 0.0873 | 0.0091 | 0 | 0.0223 | 0 | 0.0015 | 0 | 0.0135 | 0 | 0.0329 | 0 | 0.0214 | 0.0407 | 0 | 0 | 0 | 0 | 0.0367 | 0.0575 | 0.1989 | 0.0122 | Program not offered | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | 0 | 0 | 0 | 0 | 1 | Not distance-education only | 21551 | 0.842 | 0.0671 | 0.0323 | 0.025 | 0.0063 | 0.0001 | 0.0057 | 0.0131 | 0.0085 | 0.0894 | Currently certified as operating | 22183 | 17216 | 19189 | 22210 | 24383 | 25805 | 18021 | 20807 | 25232 | 1090 | 228 | 157 | 181 | 211 | 313 | 29164 | 10424 | 28040 | 14724 | 11406 | 9738 | 0.8734 | 0.1631 | 0.7292 | 0.7188 | 2 | 0.7894 | 3911 | 7878 | 0.7464 | 0.5597 | 0.6842 | 0.6905 | 0.6552 | 0.6471 | 0.7091 | 0.898 | 0.6923 | 0.347 | 0.0427 | 0.042 | 0.731666973 | 0.7904451683 | 0.7196902655 | 0.6166201117 | 0.7243382828 | 0.8032520325 | 0.741902419 | 0.6429840142 | 0.6513108614 | 0.8090941898 | 0.7183994016 | 0.7444886158 | 0.6573033708 | 0.7537544696 | 0.778889343 | 0.829545455 | 0.777962578 | 0.670141474 | 0.774237288 | 0.852403846 | 0.790193843 | 0.682261209 | 0.698901099 | 0.848265345 | 0.780844835 | 0.777024332 | 0.715870307 | 0.798711755 | 0.803736162 | 0.893864013 | 0.789177605 | 0.712832551 | 0.803546099 | 0.874393204 | 0.813687224 | 0.726166329 | 0.723762376 | 0.873488774 | 0.806063523 | 0.801594331 | 0.775568182 | 0.812804878 | 0.2626520204 | 0.0874852883 | 0.2136715391 | 0.7735426009 | 0.1860230257 | 0.1304433111 | 0.1335817968 | 0.1571204394 | 0.3162024323 | 0.1317712812 | 0.1401547721 | 0.1165919283 | 0.0650224215 | 0.0080791759 | 0.1779438497 | 0.8139769743 | 0.4515496273 | 0.2718713221 | 0.1814437034 | 0.1208316987 | 95514 | 20907 | 17500 | 21500 | 7500 | 16750 | 19000 | 16649 | 17500 | 16500 | 20750 | 14668.5 | 18500 | 16250 | 19000 | 17000 | 5898 | 3876 | 2048 | 1439 | 1544 | 2915 | 5316 | 582 | 2752 | 3146 | 2962 | 2936 | 1110 | 4788 | 222.304745944118 | 5898 | 34000 | 27000 | 7500 | 4500 | 5098 | 4652 | 446 | 5098 | 4951 | 5098 | 5441 | 921 | 4520 | 1432 | 1549 | 2460 | 4878 | 563 | 2670 | 2771 | 2674 | 2767 | 1246 | 4195 | 4898 | 88 | 4810 | 1343 | 1475 | 2080 | 4385 | 513 | 2275 | 2623 | 2391 | 2507 | 1172 | 3726 | 4336 | 603 | 3733 | 1278 | 1410 | 1648 | 3843 | 493 | 2020 | 2316 | 2078 | 2258 | 1056 | 3280 | 0.8815221656 | 0.4488034523 | 20 | 0.5205963123 | 0.0219693998 | 0.9125147117 | 0.0031384857 | 0.1860230257 | 88987 | 66836 | 20907 | 17500 | 21500 | 222.304745944118 | 0.731666973 | 0.6166201117 | 0.7243382828 | 0.8032520325 | 0.7904451683 | 0.7196902655 | 0.741902419 | 0.6429840142 | 0.6513108614 | 0.8090941898 | 0.7183994016 | 0.7444886158 | 0.6573033708 | 0.7537544696 | 0.7188 | 0.7119 | 0.4431 | 3911 | 0.1872 | 3911 | 4-year | 0.5095 | 0.4905 | 3727 | 9/8/1987 | 3363 | 268 | 95 | 84 | 29 | 0 | 0 | 17 | 55 | 20629 | No | 235 | 5501 | SACSCC | 3943 | 0.7109 | 3943 | 0.7373 | 0.0079 | 0.2125 | 0.0424 | 24 | 0.3333 | 24 | 0.375 | 0.0417 | 0.5417 | 0.0417 | 1167 | 0.7275 | 1167 | 0.7352 | 0.0069 | 0.2039 | 0.054 | 126 | 0.5238 | 126 | 0.5397 | 0.0079 | 0.3254 | 0.127 |
And with that, I think we have a much more usable set of data!
In this video, I pull this into a simple data package and add some additional documentation, to make sure future me remembers what the columns mean.