diff --git a/R/plot.OutputsModel.R b/R/plot.OutputsModel.R index 5b3911eff21860e0de00811697aaf63f83d5eef4..79ff7abe474b5b2988959566b5be59abb8f76a3d 100644 --- a/R/plot.OutputsModel.R +++ b/R/plot.OutputsModel.R @@ -456,7 +456,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = lines(Xaxis, OutputsModel$CemaNeigeLayers[[iLayer]]$Temp, lty = 3, col = "orchid", lwd = lwd * lwdk * 0.8) } abline(h = 0, col = "grey", lty = 2) - lines(Xaxis, SnowPackLayerMean, type = "l", lwd = lwd * lwdk *1.0, col = "darkorchid4") + lines(Xaxis, SnowPackLayerMean, type = "l", lwd = lwd * lwdk * 1.0, col = "darkorchid4") axis(side = 2, at = pretty(ylim1), labels = pretty(ylim1), cex.axis = cex.axis, ...) mtext(side = 2, expression(paste("temp. [", degree, "C]"), sep = ""), padj = 0.2, line = line, cex = cex.lab) @@ -486,7 +486,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = SnowPackLayerMean <- SnowPackLayerMean + OutputsModel$CemaNeigeLayers[[iLayer]]$SnowPack/NLayers } } - plot(Xaxis, SnowPackLayerMean, type = "l", ylim = ylim1, lwd = lwd * lwdk *1.2, col = "royalblue", xlab = "", ylab = "", xaxt = "n", yaxt = "n", ...) + plot(Xaxis, SnowPackLayerMean, type = "l", ylim = ylim1, lwd = lwd * lwdk * 1.2, col = "royalblue", xlab = "", ylab = "", xaxt = "n", yaxt = "n", ...) for (iLayer in 1:NLayers) { lines(Xaxis, OutputsModel$CemaNeigeLayers[[iLayer]]$SnowPack, lty = 3, col = "royalblue", lwd = lwd * lwdk * 0.8) } @@ -522,17 +522,17 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = if (BOOL_Qobs) { ylim1 <- range(c(ylim1, DATA2), na.rm = TRUE) } - ylim2 <- c(ylim1[1], 1.1*ylim1[2]) + ylim2 <- c(ylim1[1], 1.1 * ylim1[2]) plot(Xaxis, rep(NA, length(Xaxis)), type = "n", ylim = ylim2, xlab = "", ylab = "", xaxt = "n", yaxt = "n", ...) txtleg <- NULL colleg <- NULL if (BOOL_Qobs) { - lines(Xaxis, DATA2, lwd = lwd * lwdk , lty = 1, col = par("fg")) + lines(Xaxis, DATA2, lwd = lwd * lwdk, lty = 1, col = par("fg")) txtleg <- c(txtleg, "observed") colleg <- c(colleg, par("fg")) } if (BOOL_Qsim) { - lines(Xaxis, DATA3, lwd = lwd * lwdk , lty = 1, col = "orangered") + lines(Xaxis, DATA3, lwd = lwd * lwdk, lty = 1, col = "orangered") txtleg <- c(txtleg, "simulated") colleg <- c(colleg, "orangered") } @@ -544,7 +544,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = mtext(side = 4, paste("flow", "[m3/s]"), line = line, cex = cex.lab) } AxisTS(OutputsModel) - legend("topright", txtleg, col = colleg, lty = 1, lwd = lwd * lwdk , bty = "o", bg = bg, box.col = bg, cex = cex.leg) + legend("topright", txtleg, col = colleg, lty = 1, lwd = lwd * lwdk, bty = "o", bg = bg, box.col = bg, cex = cex.leg) legend("bottomright", "log scale", lty = 1, col = NA, bty = "o", bg = bg, box.col = bg, cex = cex.leg) box() } @@ -556,17 +556,17 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = if (BOOL_Qobs) { ylim1 <- range(c(ylim1, Qobs), na.rm = TRUE) } - ylim2 <- c(ylim1[1], 1.1*ylim1[2]) + ylim2 <- c(ylim1[1], 1.1 * ylim1[2]) plot(Xaxis, rep(NA, length(Xaxis)), type = "n", ylim = ylim2, xlab = "", ylab = "", xaxt = "n", yaxt = "n", ...) txtleg <- NULL colleg <- NULL if (BOOL_Qobs) { - lines(Xaxis, Qobs, lwd = lwd * lwdk , lty = 1, col = par("fg")) + lines(Xaxis, Qobs, lwd = lwd * lwdk, lty = 1, col = par("fg")) txtleg <- c(txtleg, "observed") colleg <- c(colleg, par("fg")) } if (BOOL_Qsim) { - lines(Xaxis, OutputsModel$Qsim, lwd = lwd * lwdk , lty = 1, col = "orangered") + lines(Xaxis, OutputsModel$Qsim, lwd = lwd * lwdk, lty = 1, col = "orangered") txtleg <- c(txtleg, "simulated") colleg <- c(colleg, "orangered") } @@ -574,11 +574,11 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = mtext(side = 2, paste("flow", plotunit), line = line, cex = cex.lab) if (!is.null(BasinArea)) { Factor <- Factor_UNIT_M3S - axis(side = 4, at = pretty(ylim1*Factor)/Factor, labels = pretty(ylim1*Factor), cex.axis = cex.axis, ...) + axis(side = 4, at = pretty(ylim1 * Factor)/Factor, labels = pretty(ylim1 * Factor), cex.axis = cex.axis, ...) mtext(side = 4, paste("flow", "[m3/s]"), line = line, cex = cex.lab) } AxisTS(OutputsModel) - legend("topright", txtleg, col = colleg, lty = 1, lwd = lwd * lwdk , bty = "o", bg = bg, box.col = bg, cex = cex.leg) + legend("topright", txtleg, col = colleg, lty = 1, lwd = lwd * lwdk, bty = "o", bg = bg, box.col = bg, cex = cex.leg) box() } @@ -604,7 +604,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = mtext(side = 2, paste("flow error", plotunit), cex = cex.lab, line = line) if (!is.null(BasinArea)) { Factor <- Factor_UNIT_M3S - axis(side = 4, at = pretty(ylim1*Factor)/Factor, labels = pretty(ylim1*Factor), cex.axis = cex.axis, ...) + axis(side = 4, at = pretty(ylim1 * Factor)/Factor, labels = pretty(ylim1 * Factor), cex.axis = cex.axis, ...) mtext(side = 4, paste("flow error", "[m3/s]"), line = line, cex = cex.lab) } AxisTS(OutputsModel) @@ -683,7 +683,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = SeqY <- data.frame(Dates = as.numeric(format(seq(as.Date("1970-01-01", tz = "UTC"), as.Date("1970-12-31", tz = "UTC"), "day"), format = "%m%d"))) - DataDailyInterAn <- as.data.frame(aggregate(DataDaily[, 2:5], by = list(as.numeric(substr(TxtDatesDataDaily , 5, 8))), FUN = mean, na.rm = TRUE)) + DataDailyInterAn <- as.data.frame(aggregate(DataDaily[, 2:5], by = list(as.numeric(substr(TxtDatesDataDaily, 5, 8))), FUN = mean, na.rm = TRUE)) colnames(DataDailyInterAn) <- c("Dates", "Precip", "Psol", "Qobs", "Qsim") DataDailyInterAn <- merge(SeqY, DataDailyInterAn, by = "Dates", all.x = TRUE, all.y = FALSE) } @@ -733,17 +733,17 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = ## Plot_forcings if (BOOL_Pobs) { plot(SeqX2[DataMonthlyInterAn$Dates], DataPlotP$Precip, type = "h", - xlim = range(SeqX1), ylim = c(3*ylimP[1], ylimP[2]), lwd = lwdP, lend = 1, lty = 1, col = "royalblue", + xlim = range(SeqX1), ylim = c(3 * ylimP[1], ylimP[2]), lwd = lwdP, lend = 1, lty = 1, col = "royalblue", xlab = "", ylab = "", xaxt = "n", yaxt = "n", yaxs = "i", bty = "n", ...) txtleg <- c(txtleg, "Ptot" ) colleg <- c(colleg, "royalblue") lwdleg <- c(lwdleg, lwdP/3) - axis(side = 2, at = pretty(0.8*ylimP, n = 3), labels = pretty(0.8*ylimP, n = 3), col.axis = "royalblue", col.ticks = "royalblue", cex.axis = cex.axis, ...) + axis(side = 2, at = pretty(0.8 * ylimP, n = 3), labels = pretty(0.8 * ylimP, n = 3), col.axis = "royalblue", col.ticks = "royalblue", cex.axis = cex.axis, ...) par(new = TRUE) } if (BOOL_Psol) { plot(SeqX2, DataPlotP$Psol[DataMonthlyInterAn$Dates], type = "h", xlim = range(SeqX1), - ylim = c(3*ylimP[1], ylimP[2]), lwd = lwdP, lend = 1, lty = 1, col = "lightblue", + ylim = c(3 * ylimP[1], ylimP[2]), lwd = lwdP, lend = 1, lty = 1, col = "lightblue", xlab = "", ylab = "", xaxt = "n", yaxt = "n", yaxs = "i", bty = "n", ...) txtleg <- c(txtleg, "Psol" ) colleg <- c(colleg, "lightblue") @@ -751,15 +751,15 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = par(new = TRUE) } ## Plot_flows - plot(NULL, type = "n", xlim = range(SeqX1), ylim = c(ylimQ[1], 2*ylimQ[2]), xlab = "", ylab = "", xaxt = "n", yaxt = "n", ...) + plot(NULL, type = "n", xlim = range(SeqX1), ylim = c(ylimQ[1], 2 * ylimQ[2]), xlab = "", ylab = "", xaxt = "n", yaxt = "n", ...) if (BOOL_Qobs) { - lines(1:nrow(DataPlotQ), DataPlotQ$Qobs, lwd = lwd * lwdk , lty = 1, col = par("fg") ) + lines(1:nrow(DataPlotQ), DataPlotQ$Qobs, lwd = lwd * lwdk, lty = 1, col = par("fg") ) txtleg <- c(txtleg, "Qobs" ) colleg <- c(colleg, par("fg") ) lwdleg <- c(lwdleg, lwd) } if (BOOL_Qsim) { - lines(1:nrow(DataPlotQ), DataPlotQ$Qsim, lwd = lwd * lwdk , lty = 1, col = "orangered") + lines(1:nrow(DataPlotQ), DataPlotQ$Qsim, lwd = lwd * lwdk, lty = 1, col = "orangered") txtleg <- c(txtleg, "Qsim") colleg <- c(colleg, "orangered") lwdleg <- c(lwdleg, lwd) @@ -778,7 +778,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = mtext(side = 2, paste(txtlab, plotunitregime), line = line, cex = cex.lab) if (!is.null(BasinArea)) { Factor <- Factor_UNIT_M3S / (365.25 / 12) - axis(side = 4, at = pretty(ylimQ*Factor)/Factor, labels = pretty(ylimQ*Factor), cex.axis = cex.axis, ...) + axis(side = 4, at = pretty(ylimQ * Factor)/Factor, labels = pretty(ylimQ * Factor), cex.axis = cex.axis, ...) mtext(side = 4, paste("flow", "[m3/s]"), line = line, cex = cex.lab) } box() @@ -844,7 +844,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = } if (!is.null(BasinArea)) { Factor <- Factor_UNIT_M3S - axis(side = 4, at = seqDATA1, labels = round(seqDATA2*Factor, digits = 2), cex.axis = cex.axis, ...) + axis(side = 4, at = seqDATA1, labels = round(seqDATA2 * Factor, digits = 2), cex.axis = cex.axis, ...) mtext(side = 4, paste("flow", "[m3/s]"), line = line, cex = cex.lab) } legend("topleft", txtleg, col = colleg, lty = 1, lwd = lwd, bty = "o", bg = bg, box.col = bg, cex = cex.leg) @@ -877,7 +877,7 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea = mtext(side = 2, paste("simulated flow", plotunit), line = line, cex = cex.lab) if (!is.null(BasinArea)) { Factor <- Factor_UNIT_M3S - axis(side = 4, at = seqDATA1, labels = round(seqDATA2*Factor, digits = 2), cex.axis = cex.axis, ...) + axis(side = 4, at = seqDATA1, labels = round(seqDATA2 * Factor, digits = 2), cex.axis = cex.axis, ...) mtext(side = 4, paste("simulated flow", "[m3/s]"), line = line, cex = cex.lab) } legend("bottomright", "log scale", lty = 1, col = NA, bty = "o", bg = bg, box.col = bg, cex = cex.leg)