Rmd

Legende

Zeitpunkt <- c(1, 2)
Beziehung <- c(1.967,1.8269)
Selbstwert  <- c(0.9967,1.3333)
Bewältigung <- c(0.2157,0.7756)
Klärung <- c(0.5294,0.8462)
Fortschritte <- c(0.6275,0.6538)
Aufgehoben <- c(1.142,1.228)
Kontrolle <- c(1.1667,1.458)
Aktualisierung <- c(0.64,0.2647)
Gesamt <- c(0.910625,1.0475)
Auswahl <- c(0.9272,1.1955)
graph <- data.frame(Zeitpunkt, Beziehung, Selbstwert, Bewältigung,Klärung, Fortschritte, Aufgehoben, Kontrolle, Aktualisierung, Gesamt, Auswahl)

require("ggplot2")
## Loading required package: ggplot2
pplot2 <- ggplot(data=graph, aes(x=Zeitpunkt)) +
  geom_line(aes(y=Beziehung, color="Beziehung")) + 
  geom_line(aes(y=Selbstwert, color="Selbstwert")) + 
  geom_line(aes(y=Bewältigung, color="Bewältigung")) + 
  geom_line(aes(y=Klärung, color="Klärung")) + 
  geom_line(aes(y=Fortschritte, color="Fortschritte")) + 
  geom_line(aes(y=Aufgehoben, color="Aufgehoben")) + 
  geom_line(aes(y=Kontrolle, color="Kontrolle")) + 
  geom_line(aes(y=Aktualisierung, color="Aktualisierung")) + 
  geom_line(aes(y=Gesamt, color="Gesamt"), size=2) + 
  geom_line(aes(y=Auswahl, color="Auswahl"), size=2) + 
  geom_point(aes(y=Beziehung, color='Beziehung'), shape=15) + 
  geom_point(aes(y=Selbstwert, color="Selbstwert"), shape=15) + 
  geom_point(aes(y=Bewältigung, color="Bewältigung"), shape=15) + 
  geom_point(aes(y=Klärung, color="Klärung"), shape=15) + 
  geom_point(aes(y=Fortschritte, color="Fortschritte"), shape=15) + 
  geom_point(aes(y=Aufgehoben, color="Aufgehoben"), shape=15) + 
  geom_point(aes(y=Kontrolle, color="Kontrolle"), shape=15) + 
  geom_point(aes(y=Aktualisierung, color="#Aktualisierung"), shape=15) + 
  geom_point(aes(y=Gesamt, color="Gesamt"), size=4, shape=15) + 
  geom_point(aes(y=Auswahl, color="Auswahl"), size=4, shape=15) + 
  ylim(0, 2.1) + 
  xlim(1, 2) +
  scale_colour_manual("", 
    breaks = c("Beziehung", "Selbstwert", "Bewältigung", "Klärung", "Fortschritte", "Aufgehoben", "Kontrolle", "Aktualisierung", "Gesamt", "Auswahl", 
               "Beziehung", "Selbstwert", "Bewältigung", "Klärung", "Fortschritte", "Aufgehoben", "Kontrolle", "Aktualisierung", "Gesamt", "Auswahl"),
    values = c("blue", "#E69F00", "#56B4E9", "#009E73", "#F0E442", "#0072B2", "#D55E00", "#CC79A7", "#000000", "#999999", 
               "blue", "#E69F00", "#56B4E9", "#009E73", "#F0E442", "#0072B2", "#D55E00", "#CC79A7", "#000000", "#999999")) +
    scale_x_continuous(breaks=seq(1, 2, 1), labels = c("erste Messung", "letzte Messung")) 
## Scale for 'x' is already present. Adding another scale for 'x', which
## will replace the existing scale.
pplot2