MySet(col = NULL, pch = 15:18, lty = 1:3, cex = 1, col.bar = NULL, n = if (is.numeric(col)) col else 4, h.start = 120, theme = latticeExtra::ggplot2like(n = n, h.start = h.start), reset = FALSE, show.device = FALSE, ...) Set3 rosa-himmelblau brewer.pal(8,"Set3")[c(3,4)]
Achtung die Beispiele hier gehen nicht weil knit! http://www.magesblog.com/2012/12/changing-colours-and-legends-in-lattice.html
library(stp25data) # meine Daten library(stp25plot) # meine Funktionen library(lattice) # Lattice-Plots library(RColorBrewer) # Farben library(effects) # Effekte require(gridExtra) # Plots agregieren
library(stpvers) library(lattice) library(RColorBrewer) library(effects) require(gridExtra)
myColours <- brewer.pal(9,"Set1")[c(8,2)] # -- brewer.pal(4,"Dark2") # - get Default settings # trellis.par.get()$plot.symbol # names(trellis.par.get()) trellis.par.set( # -- auto.key und dotplot superpose.symbol = list(col=myColours, pch = 15:17), # -- barchart superpose.polygon = list(col=myColours, border="transparent"), plot.polygon =list(col="#' 377EB8"), # -- linien superpose.line = list(col=myColours, lty=1:3), # -- boxplotsund symbol fuer ausreiser und xyplot box.dot = list(pch=19, cex=1.2), # box.rectangle =list(), # box.umbrella = list(), plot.symbol=list(pch=1) # dot.symbol=list( ) ) # windows(8,8) # show.settings()
# ------------------------------------------------------------------------------- x1<-rnorm(100); x2<-gl(2, 50, labels = c("Control", "Treat")) y<-(1.5-as.numeric(x2))*x1+rnorm(100) #windows(7,4) p1<- xyplot(y~x1|x2, xlab = expression(hat(mu)[0]), type=(c("p", "r")), # - auch mit fontsize=20 ylab=list(label="Percent of Respondents", cex=2), par.strip.text=list(lines=2.5, col=6), strip=strip.custom(factor.levels= expression( sqrt(G^{1}), sqrt(italic(R)^{1})))) print(p1)
Für Rmd- Files muss MySet(knit=TRUE) verwendet werden. Referenzlienien sind weiss können aber direkt lattice::trellis.par.set geändert werden.
trellis.par.set(list(
axis.line = list(col = NA),
reference.line = list(col = "grey")) )
MySet(knit=TRUE, axis.grid=TRUE) xyplot(y~x1|x2, xlab = expression(hat(mu)[0]), type=(c("p", "r")) # par.settings = list( axis.line = list(col = NA), # reference.line = list(col = "grey")) )
MySet() bwplot2(tzell ~ factor(lai), hkarz, groups=gruppe, xlab="", box.width = 1/4, auto.key=list(columns=2) )
bwplot(yield ~ site, barley, groups = year, panel = function(x, y, groups, subscripts, ...) { # panel.grid(h = -1, v = 0) panel.stripplot(x, y, ..., jitter.data = TRUE, groups = groups, subscripts = subscripts) panel.superpose(x, y, ..., panel.groups = panel.average, groups = groups, subscripts = subscripts) panel.points(x, y, ..., panel.groups = panel.average, groups = groups, subscripts = subscripts) # panel.mean(x, y, ... ) }, auto.key = list(points = FALSE, lines = TRUE, columns = 2))
x1<- rnorm(10); x2<- rnorm(10); x3<- rnorm(10) y1<- x1*2+x2 +rnorm(10); y2<- x1/2+x2 +rnorm(10) m1<- lm(y1 ~x1+x2+x3) m2<- lm(y2 ~x1+x2)
zum Extrahieren der (Lattice) Grafikgibt es zwei werde erstens über allEffects() und zugriff auf das Listenobjekt oder durch direkte Auswahl über effect()
p1 <- plot(allEffects(m1)[[1]]) p2 <- plot(allEffects(m2)[[1]]) p3 <- plot(allEffects(m2)[[2]]) class(p1) <- class(p2) <- class(p3) <-"trellis" windows(8,8) grid.arrange(p1, p2,p3, ncol=3)
p1 <- plot(effect("x1", m1) ) p2 <- plot(effect("x1", m2) ) p3 <- plot(effect("x2", m2) ) grid.arrange(p1, p2, p3, ncol=3)
strip=strip.custom(strip.names=FALSE)
fit2<-lm(chol0 ~ rrs0 + ak*g + med*g, hyper) #head(hyper)
Default Einstellung ohne das g (Geschlecht) im Factor-Heading.
plot(allEffects(fit2), main="", factor.names=FALSE )
Jetzt mit Multilines multiline=TRUE mit , z.var=2
fit2<-lm(chol0 ~ rrs0 + ak*g + med*g, hyper) # Modifiziert geht nicht mehr plot.efflist <- stp25:::plot.efflist assignInNamespace("plot.efflist", stp25plot:::plot.efflist, "effects") plot(allEffects(fit2), main="", multiline=TRUE, ylab= "HDL-Cholesterin\n[mg/dl]", # das geht nicht xlab=c("syst. Blutdruck", "Altersklassen", "Medikament"), key.args=list(x=0.35,y=0.99, corner=c(x=1, y=1), border=0, #geht nicht lines=FALSE Workaround lines=list(col=0), between=-2.05, cex=.7, title = NULL #, cex.title = 1.2 ) )
alternating = FALSE ergibt beschriftung überall unten.
plot(
effect("g:med", fit2),
main = "",
factor.names = FALSE,
grid = TRUE ,
alternating = FALSE,
axes = list(x = list(rotate = 90))
)
plot(
effect("g:med", fit2), main = "",
factor.names = FALSE,
lines = list(
multiline = TRUE,
col = 1:2,
lwd = 3
),
axes = list(x = list(rotate = 90))
)
multiline=TRUE mit , z.var=2
#-- log-Skala
plot(allEffects(fit2,
transformation=list(link=log, inverse=exp)))
APA2(allEffects(fit_lme2), transform=TRUE)
APA2(allEffects(fit_lme2))
APA2(allEffects(fit_lme2, transformation=list(link=log, inverse=exp)))
library(effects) library(gridExtra) A = rnorm(100); B = rnorm(100); C = factor(rep(c("This", "That"), 50)) model = lm(A~B*C) p1<-plot(ef<-effect("B:C", model), x.var="C") ef$variables$C$levels <- c("foo", "bar") levels(ef$x$C) <- c("foo", "bar") p2<-plot(ef, x.var="C") grid.arrange(p1,p2) #ef$variables # ef[[1]]$variables$C$levels <- c("foo", "bar") levels(ef[[1]]$x$C) <- c("foo", "bar") windows(8,8) plot(ef, x.var="C") #-- Modifiziert wegen xlab plot.efflist<- stp25:::plot.efflist ef<-allEffects(lm(A~B+C)) plot(ef, xlab=c("Foo","Bar"))
library(HH) library(effects) data(hotdog, package="HH")
library(HH) library(effects) data(hotdog, package="HH")
CpT <- ancovaplot(Sodium ~ Calories + Type, data=hotdog, superpose.panel=TRUE) CpT anova(fit<-aov(Sodium ~ Calories*Type, data=hotdog)) plot(allEffects(fit))
set.seed(1) x <- runif(1000, 0, 100) z <- cut(x, c(10,20,30)) table(z) #windows(8,5) par(mfrow=c(1,2)) boxplot(x~z, main="cut") abline(h=c(10,20,30)) set.seed(1) x <- runif(1000, 0, 100) z <- Hmisc::cut2(x, c(10,20,30)) table(z) boxplot(x~z, main="cut2") abline(h=c(10,20,30))
Beispiel Balken mit Tkombinieren: 1 Kreuztabellen erstellen
set.seed(1) DF <- data.frame(treatment = gl(6, 300 / 6, labels = c("A","B", "C", "D", "E", "F")), sex = gl(2, 300 / 2, labels = c("male", "female"))[sample.int(300)])[sample.int(300,50),] Xtabs <- function(x, data = DF, ...) { dat <- xtabs(x, data) data.frame(dat, Percent = data.frame(prop.table(dat, ...))$Freq * 100) } dat1 <- Xtabs( ~ treatment, DF) dat2 <- data.frame(prop.table(xtabs( ~ treatment + sex , DF),1))
require(ggplot2) require(gridExtra) # The palette with grey: cbPalette <- c("#999999", "#E69F00", "#56B4E9", "#009E73", "#F0E442", "#0072B2", "#D55E00", "#CC79A7") # The palette with black: cbbPalette <- c("#000000", "#E69F00", "#56B4E9", "#009E73", "#F0E442", "#0072B2", "#D55E00", "#CC79A7") # To use for fills, add #scale_fill_manual(values=cbPalette) # To use for line and point colors, add #scale_colour_manual(values=cbPalette) blank_theme <- theme_minimal() + theme( axis.text.x = element_blank(), axis.title.x = element_blank(), axis.title.y = element_blank(), panel.border = element_blank(), panel.grid = element_blank(), axis.ticks = element_blank(), plot.title = element_text(size = 14, face = "bold", hjust = 0.5) ) fig.cap <- "Behandlung" p1 <- barchart( reorder(treatment, Percent) ~ Percent, dat1, origin = 0, xlim = c(-1, 26), xlab = "Prozent", main = fig.cap, # scale=list(y=list(cex=1)), panel = function(x, y, ...) { prz <- rndr_percent(dat1$Percent, dat1$Freq) panel.barchart(x, y, ...) ltext(x = .4, y = y,adj = c(0, NA), col = "white",labels = prz, cex = .75 ) } ) ## Torte fig.cap <- "Geschlechterverteilung" p2 <- ggplot(data = dat2, aes(x = "", y = Freq, fill = factor(sex))) + geom_bar(width = 1, stat = "identity") + facet_grid(facets = . ~ treatment) + coord_polar(theta = "y") + xlab('') + ylab('') + labs(fill = '') + scale_fill_manual(values = c("#F781BF", "#377EB8")) + blank_theme + # geom_text(aes( # y = c(.7, .2, .7, .2, .7, .2), # label = paste0(round(Freq * 100), "%") # ), size = 4) + theme(legend.position = "bottom", legend.box = "horizontal") + ggtitle(fig.cap) myPlot <- gridExtra::arrangeGrob(grobs = list(p1, p2), ncol = 1, heights=unit(c(.60,.40), "npc"), newpage = TRUE) grid.draw(myPlot)
Diverging palettes (div maxcolors=11)
palettes | colorblind |Farbe --------- | ---------- | ---- BrBG | TRUE | braun-gruen PiYG | TRUE | violet-gruen PRGn | TRUE | violet-gruen PuOr | TRUE | braun-violett RdBu | TRUE | rot-blau RdGy | FALSE | rot-grau RdYlBu | TRUE | rot-blau RdYlGn | FALSE | rot-gruen Spectral | FALSE| rot-blau
Qualitative palettes (qual)
palettes|maxcolors|colorblind ------ | ------- | ---------- Accent|8|FALSE Dark2|8|TRUE Paired|12|TRUE Pastel1|9|FALSE Pastel2|8|FALSE Set1|9|FALSE Set2|8|TRUE Set3|12|FALSE
Sequentialpalettes(maxcolors=9, seq)
palettes|colorblind ------ | ---------- Blues|TRUE BuGn|TRUE BuPu|TRUE GnBu|TRUE Greens|TRUE Greys|TRUE Oranges|TRUE OrRd|TRUE PuBu|TRUE PuBuGn|TRUE PuRd|TRUE Purples|TRUE RdPu|TRUE Reds|TRUE YlGn|TRUE YlGnBu|TRUE YlOrBr|TRUE YlOrRd|TRUE
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.