plotPredReal <- function(data, pred, index)
{
horizon = length(pred$getSerie(1))
- par(mar=c(4.7,5,1,1), cex.axis=2, cex.lab=2, lwd=2)
+ par(mar=c(4.7,5,1,1), cex.axis=1.5, cex.lab=1.5, lwd=3)
measure = data$getSerie(pred$getIndexInData(index)+1)[1:horizon]
yrange = range( pred$getSerie(index), measure )
- plot(measure, type="l", ylim=yrange, lwd=3, xlab="Temps (en heures)", ylab="PM10")
+ plot(measure, type="l", ylim=yrange, xlab="Temps (en heures)", ylab="PM10")
par(new=TRUE)
- plot(pred$getSerie(index), type="l", col="#0000FF", ylim=yrange, lwd=3, xlab="", ylab="")
+ plot(pred$getSerie(index), type="l", col="#0000FF", ylim=yrange, xlab="", ylab="")
}
#' @title Plot filaments
grays = gray.colors(20, 0.1, 0.9) #TODO: 20 == magic number
colors = c(
grays[ floor( 20.5 * distances[indices] / (1+max(distances[indices])) ) ], "#FF0000")
- par(mar=c(4.7,5,1,1), cex.axis=2, cex.lab=2, lwd=2)
+ par(mar=c(4.7,5,1,1), cex.axis=1.5, cex.lab=1.5, lwd=2)
for (i in seq_len(length(indices)+1))
{
ind = ifelse(i<=length(indices), indices[i] - first_day + 1, index)
weights = pred$getParams(index)$weights
if (is.null(weights))
stop("plotSimils only works on 'Neighbors' forecasts")
- par(mar=c(4.7,5,1,1))
- hist(pred$getParams(index)$weights, nclass=20, xlab="Weight", ylab="Frequency")
+ par(mar=c(4.7,5,1,1), cex.axis=1.5, cex.lab=1.5)
+ hist(pred$getParams(index)$weights, nclass=20, xlab="Poids", ylab="Effectif")
}
#' @title Plot error
{
if (!is.null(err$abs))
err = list(err)
- par(mfrow=c(2,2), mar=c(4.7,5,1,1), cex.axis=2, cex.lab=2, lwd=2)
+ par(mfrow=c(2,2), mar=c(4.7,5,1,1), cex.axis=1.5, cex.lab=1.5, lwd=2)
L = length(err)
yrange = range( sapply(1:L, function(index) ( err[[index]]$abs$day ) ), na.rm=TRUE )
for (i in seq_len(L))
series_matrix = series_matrix[,-nas_indices]
series_fds = rainbow::fds(seq_len(nrow(series_matrix)), series_matrix)
- par(mfrow=c(1,2), mar=c(4.7,5,1,1), cex.axis=2, cex.lab=2)
+ par(mfrow=c(1,2), mar=c(4.7,5,1,1), cex.axis=1.5, cex.lab=1.5)
rainbow::fboxplot(series_fds, "functional", "hdr", xlab="Temps (heures)", ylab="PM10",
plotlegend=FALSE, lwd=2)
rainbow::fboxplot(series_fds, "bivariate", "hdr", plotlegend=FALSE)