dta <- data.frame(
        SCR_value=c(0.08,0.13,0.13,0.23,
                    0.13,0.16,0.52,0.8,
                    0.1,0.09,0.26,0.65,
                    0.1,0.12,0.28,0.7),
        Emotion=c(rep("peace",4),rep("angry",4),rep("sad",4),rep("disgust",4)),
        Method=rep(c("Watch","distract","reap","supress"),4))
se <- 0.05;library(ggplot2)
ggplot(dta,
             aes(x=Method,y=SCR_value,group=Emotion,col=Emotion))+
        geom_line(linetype=5,size=1,position = position_dodge(0.1))+
        geom_point(aes(shape=Method),size=3,position = position_dodge(0.1))+
        geom_errorbar(aes(ymin=SCR_value-se,ymax=SCR_value+se),width=0.05,
                      alpha=0.9,position = position_dodge(0.1))+
        expand_limits(y=c(0,1))+
        scale_fill_brewer(palette="Dark2")+
        theme_bw()