How One High-Risk Community In Rural South Carolina Is Bracing For COVID-19 article relates to an annual survey on the effects of COVID-19 conducted on more than 400,000 Americans. The data reviews the number of people who are at high risk of becoming seriously ill from COVID-19 per ICU bed in each metropolitan, micropolitan or metropolitan area. See https://github.com/fivethirtyeight/data/tree/master/covid-geography.
library(dplyr)
library(tibble)
covid_df<- read.csv(file="https://raw.githubusercontent.com/nnaemeka-git/global-datasets/main/mmsa-icu-beds.csv")
select_val <- covid_df %>%
select(MMSA,total_percent_at_risk,total_at_risk) %>%
rename("Total % At Risk"=total_percent_at_risk,"Total At Risk"= total_at_risk)
mmsa-icu-beds.csv dataset has 136 observations and 7 variables. The icu_beds and hospital variables are discrete while the other variables are continuous with the exception of MMSA variable which represents the name of the metropolitan, micropolitan or metropolitan division available in the CDC’s BRFSS. See https://github.com/nnaemeka-git/global-datasets/blob/main/mmsa-icu-beds.csv.
## # A tibble: 136 x 7
## MMSA total_percent_a~ high_risk_per_I~ high_risk_per_h~ icu_beds hospitals
## <chr> <chr> <dbl> <dbl> <int> <int>
## 1 San Ju~ 52.88% NA NA NA NA
## 2 Manhat~ 47.29% 4490. 8980. 8 4
## 3 Hilton~ 62.72% 3904. 36439. 28 3
## 4 Kahulu~ 59.13% 3861. 19303. 20 4
## 5 Sparta~ 66.12% 3786. 85188. 45 2
## 6 Baton ~ 66.60% 3460. 39001. 124 11
## 7 Rockin~ 57.72% 3365. 40381. 60 5
## 8 Salisb~ 68.32% 3292. 37312. 68 6
## 9 Wichit~ 67.11% 3279. 19677. 24 4
## 10 Colora~ 55.96% 3252. 77226. 95 4
## # ... with 126 more rows, and 1 more variable: total_at_risk <dbl>
The subset dataset reviews metropolitan area, micropolitan area or metropolitan division with the associated percent of individuals in that area that are at high risk of becoming seriously ill from COVID-19 and the total number of high risk individuals in the area per CDC’s BRFSS.
## # A tibble: 136 x 3
## MMSA `Total % At Ris~ `Total At Risk`
## <chr> <chr> <dbl>
## 1 San Juan-Carolina-Caguas, PR 52.88% 923725.
## 2 Manhattan, KS 47.29% 35919.
## 3 Hilton Head Island-Bluffton-Beaufort, SC 62.72% 109317.
## 4 Kahului-Wailuku-Lahaina, HI 59.13% 77211.
## 5 Spartanburg, SC 66.12% 170375.
## 6 Baton Rouge, LA 66.60% 429007.
## 7 Rockingham County-Strafford County, NH, Met~ 57.72% 201903.
## 8 Salisbury, MD-DE 68.32% 223874.
## 9 Wichita Falls, TX 67.11% 78706.
## 10 Colorado Springs, CO 55.96% 308902.
## # ... with 126 more rows