df.rep.import<-read.csv("~/Current Projects/Replicate_smartphone/analysis.mark_04.18.24_edit.csv")

for (i.metric in unique(df.rep.import$Metric)) {
 df.metric<-as.data.frame(df.rep.import) 
 df.metric<-df.metric %>%
   filter(Metric == i.metric)
 
 
 
 m.full <- 
   df.metric |>
   ggplot(aes(x=Coefficient,
              y = Independent.variable,
              color=X, fil=X,
              xmin=Lower.CI, xmax=Upper.CI)) + 
   theme_classic()+
   geom_point(shape=15, size=3,
              position=position_dodge(width = 0.5)) +
   geom_linerange(position=position_dodge(width = 0.5 )) +
   geom_vline(xintercept = 0, linetype="dashed",) +
   labs(x="Regression Beta", y="") +
   theme(text = element_text(size=20))+
   geom_hline(yintercept=1, lty=2) +
   ggtitle(label = i.metric)

 print(m.full)
 
}