##```{r 1} library(dplyr) ab_testing_Jesus <- ab_testing_Jesus %>% rename(ads = “…1”) %>% rename(purchase = “…2”) %>% rename(Ab0 = “0”) %>% rename(Ab1 = “1”) #renaming all variables we need
ab_testing_Jesus <- select(ab_testing_Jesus, c(ads, purchase, Ab0, Ab1)) # taking variables we want
ab_testing_Jesus <- ab_testing_Jesus[-1, ] #getting rid of the first row
ab_testing_Jesus <- ab_testing_Jesus %>% mutate_all(as.integer) #changing data from chr to int
##```{r 2}
abtesting <- abtesting %>%
rename(ads = "...1") %>%
rename(purchase = "...2") %>%
rename(Ab0 = "0") %>%
rename(Ab1 = "1")
abtesting<- select(abtesting, c(ads, purchase, Ab0, Ab1))
abtesting <- abtesting[-1, ]
abtesting <- abtesting %>%
mutate_all(as.integer)
##```{r 3}
combined_dataset <- rbind(ab_testing_Jesus, abtesting) #combining into one dataset
```