probably it is because ggplot2 uses defaults loess params, while
lattice changes some settings:
see definition of
> panel.loess
and
> StatSmooth$with(calculate)
and maybe this code helps:
d <- data.frame(x=rnorm(100), y=rnorm(100))
dev.new()
xyplot( y~x, data = d, panel = function(x, y, ...) {
panel.xyplot(x,y, col="gray65", pch=1.1, cex=1.1)
panel.loess(x, y, span = 1, degree=1, family="gaussian", col="black", lwd=3)
} )
dev.new()
ggplot(d, aes(x,y)) + stat_smooth(span=1, degree=1, family="gaussian")
+ geom_point()
--
Kohske Takahashi <takahash...@gmail.com>
Research Center for Advanced Science and Technology,
The University of Tokyo, Japan.
http://www.fennel.rcast.u-tokyo.ac.jp/profilee_ktakahashi.html
> --
> You received this message because you are subscribed to the ggplot2 mailing
> list.
> Please provide a reproducible example: http://gist.github.com/270442
>
> To post: email ggp...@googlegroups.com
> To unsubscribe: email ggplot2+u...@googlegroups.com
> More options: http://groups.google.com/group/ggplot2
>