ds<- read.csv("data_virtual_clinic.csv") %>% clean_names() %>% mutate(phase=as.character(phase)) %>% 
  mutate(phase=factor(phase, levels=c(1,2), labels=c("Pre", "Post")))
ds %>% 
  ggplot(aes(x=phase, y=time))+
  geom_boxplot()+
  geom_jitter(width=0.2)+
  labs(y="Waiting time in hours", x= "Virtual Bed Implementation")+
  theme_classic()

ds %>% 
  ggplot(aes(x=phase,  fill=waiting_time_group))+
  geom_bar(position="fill")+
  theme_classic()+
  labs(fill="Waiting Time", x="Virtual Bed Implementation")