Dear all,
I was trying to achieve following style as in
'
http://stackoverflow.com/questions/12675147/how-can-we-make-xkcd-style-graphs-in-r'.
Below are the underlying codes:
library(ggplot2)
library(extrafont)
### Already have read in fonts (see previous answer on how to do this)
loadfonts()
### Set up the trial dataset
data <- NULL
data$x <- seq(1, 10, 0.1)
data$y1 <- sin(data$x)
data$y2 <- cos(data$x)
data$xaxis <- -1.5
data <- as.data.frame(data)
### XKCD theme
theme_xkcd <- theme(
panel.background = element_rect(fill="white"),
axis.ticks = element_line(colour=NA),
panel.grid = element_line(colour="white"),
axis.text.y = element_text(colour=NA),
axis.text.x = element_text(colour="black"),
text = element_text(size=16, family="Humor Sans")
)
### Plot the chart
p <- ggplot(data=data, aes(x=x, y=y1))+
geom_line(aes(y=y2), position="jitter")+
geom_line(colour="white", size=3, position="jitter")+
geom_line(colour="red", size=1, position="jitter")+
geom_text(family="Humor Sans", x=6, y=-1.2, label="A SIN AND COS CURVE")+
geom_line(aes(y=xaxis), position = position_jitter(h = 0.005),
colour="black")+
scale_x_continuous(breaks=c(2, 5, 6, 9),
labels = c("YARD", "STEPS", "DOOR", "INSIDE"))+labs(x="", y="")+
theme_xkcd
However I am not getting the 'Humor Sans' font-effect. I am getting
following Warning message:
> p
Warning messages:
1: In grid.Call(L_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
Font family not found in Windows font database
2: In grid.Call(L_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
Font family not found in Windows font database
3: In grid.Call(L_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
Font family not found in Windows font database
4: In grid.Call(L_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
Font family not found in Windows font database
5: In grid.Call(L_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
Font family not found in Windows font database
6: In grid.Call.graphics(L_text, as.graphicsAnnot(x$label), x$x, x$y, :
Font family not found in Windows font database
7: In grid.Call(L_textBounds, as.graphicsAnnot(x$label), x$x, x$y, :
Font family not found in Windows font database
However I have checked that, I have installed the font 'Humor Sans'
onto my machine (i.e. this font is there in the 'Windows -->> Fonts'
folder). I am using R 2.15.1 in Windows 7 machine.
Can somebody help me where my implementation went wrong?
Thanks and regards,