library(tidyverse)
## ── Attaching packages ─────────────────────────────────────── tidyverse 1.3.2 ──
## ✔ ggplot2 3.3.6     ✔ purrr   0.3.4
## ✔ tibble  3.1.7     ✔ dplyr   1.0.9
## ✔ tidyr   1.2.0     ✔ stringr 1.4.0
## ✔ readr   2.1.2     ✔ forcats 0.5.1
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
library(readxl)
library(readr)
library(lubridate)
## 
## Attaching package: 'lubridate'
## 
## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, union
library(mapdata)
## Loading required package: maps
## 
## Attaching package: 'maps'
## 
## The following object is masked from 'package:purrr':
## 
##     map
library(stringr)
library(maps)
library(dplyr)
library(magrittr)
## 
## Attaching package: 'magrittr'
## 
## The following object is masked from 'package:purrr':
## 
##     set_names
## 
## The following object is masked from 'package:tidyr':
## 
##     extract
library(wrapr)
## 
## Attaching package: 'wrapr'
## 
## The following object is masked from 'package:dplyr':
## 
##     coalesce
## 
## The following objects are masked from 'package:tidyr':
## 
##     pack, unpack
## 
## The following object is masked from 'package:tibble':
## 
##     view
library(sqldf)
## Loading required package: gsubfn
## Loading required package: proto
## Warning in doTryCatch(return(expr), name, parentenv, handler): unable to load shared object '/Library/Frameworks/R.framework/Resources/modules//R_X11.so':
##   dlopen(/Library/Frameworks/R.framework/Resources/modules//R_X11.so, 0x0006): Library not loaded: /opt/X11/lib/libSM.6.dylib
##   Referenced from: /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/modules/R_X11.so
##   Reason: tried: '/opt/X11/lib/libSM.6.dylib' (no such file), '/Library/Frameworks/R.framework/Resources/lib/libSM.6.dylib' (no such file), '/Library/Java/JavaVirtualMachines/jdk-17.0.1+12/Contents/Home/lib/server/libSM.6.dylib' (no such file)
## tcltk DLL is linked to '/opt/X11/lib/libX11.6.dylib'
## Could not load tcltk.  Will use slower R code instead.
## Loading required package: RSQLite
rm(list = ls())

SDP2022 <- read.csv("SDP2022.csv", stringsAsFactors  = FALSE, sep = ',')

SDP2023 <- read.csv('SDP2023.csv', stringsAsFactors = FALSE, sep = ',')

Masterman2023 <- SDP2023 %>%
  filter(Receiving.School.Name == 'Julia R. Masterman School') %>%
  filter(X..Applications > 20)
Masterman2023$X..Accepted.by.Program <- as.numeric(unlist(Masterman2023$X..Accepted.by.Program))
Masterman2023 <- Masterman2023 %>%
  mutate(Acceptance.Rate = (X..Accepted.by.Program/X..Applications) * 100)

Palumbo2023 <- SDP2023 %>%
  filter(Receiving.School.Name == 'Academy at Palumbo') %>%
  filter(X..Applications > 20)
Palumbo2023$X..Accepted.by.Program <- as.numeric(unlist(Palumbo2023$X..Accepted.by.Program))
Palumbo2023 <- Palumbo2023 %>%
  mutate(Acceptance.Rate = (X..Accepted.by.Program/X..Applications) * 100)

Central2023 <- SDP2023 %>%
  filter(Receiving.School.Name == 'Central High School') %>%
  filter(X..Applications > 20)
Central2023$X..Accepted.by.Program <- as.numeric(unlist(Central2023$X..Accepted.by.Program))
Central2023 <- Central2023 %>%
  mutate(Acceptance.Rate = (X..Accepted.by.Program/X..Applications) * 100)

SDP2022 <- read.csv('SDP2022.csv', stringsAsFactors = FALSE, sep = ',')

Masterman2022 <- SDP2022 %>%
  filter(Receiving.School.Name == 'Masterman, Julia R. High School') %>%
  filter(X..Applications > 20) %>%
  filter(Grade.Level == '5')
Masterman2022$X..Accepted.by.Program <- as.numeric(unlist(Masterman2022$X..Accepted.by.Program))
Masterman2022 <- Masterman2022 %>%
  mutate(Acceptance.Rate = (X..Accepted.by.Program/X..Applications) * 100)

Central2022 <- SDP2022 %>%
  filter(Receiving.School.Name == 'Central High School') %>%
  filter(X..Applications > 20)
Central2022$X..Accepted.by.Program <- as.numeric(unlist(Central2022$X..Accepted.by.Program))
Central2022 <- Central2022 %>%
  mutate(Acceptance.Rate = (X..Accepted.by.Program/X..Applications) * 100)

Palumbo2022 <- SDP2022 %>%
  filter(Receiving.School.Name == 'Academy at Palumbo') %>%
  filter(X..Applications > 20)
Palumbo2022$X..Accepted.by.Program <- as.numeric(unlist(Palumbo2022$X..Accepted.by.Program))
Palumbo2022 <- Palumbo2022 %>%
  mutate(Acceptance.Rate = (X..Accepted.by.Program/X..Applications) * 100)