library(ggplot2);library(reshape)
dta <- data.frame(pace=0.17,anger=0.25,sad=0.19,disgust=0.27)
dtam <- melt(dta);colnames(dtam) <- c("Emotion","SCR_value")
## Using  as id variables
se=0.014
ggplot(dtam,aes(x=Emotion,y=SCR_value,col=Emotion))+
        geom_point()+
        geom_errorbar(aes(ymin=SCR_value-se,ymax=SCR_value+se),
                      width=0.05)+
        expand_limits(y=c(0,0.3))+
        scale_fill_brewer(palette="Dark2")+
        theme_bw()