diff --git a/R/plot.OutputsModel.R b/R/plot.OutputsModel.R
index 86e3cd67a8cef69feb8da218a600ecc00d4b259e..914acc89e0f9faca08054d471c7535bff1a87bdc 100644
--- a/R/plot.OutputsModel.R
+++ b/R/plot.OutputsModel.R
@@ -376,20 +376,15 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
       legend("bottomright", legend = c("solid","liquid"),
              col = c("lightblue", "royalblue"), lty = c(1, 1), lwd = c(lwd, lwd),
              bty = "o", bg = bg, box.col = bg, cex = cex.leg)
-      # par(new = TRUE)
-      # plot(Xaxis, PsolLayerMean[IndPeriod_Plot],
       points(Xaxis, PsolLayerMean[IndPeriod_Plot],
            type = "h", xaxt = "n", yaxt = "n", yaxs = "i", ylim = ylim2,
            col = "lightblue", lwd = lwdP * lwdk, lend = 1,
            xlab = "", ylab = "", ...)
     }
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-      # axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
+
     AxisTS(OutputsModel)
+
+    box()
   }
 
 
@@ -427,13 +422,9 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
 
     mtext(side = 2, paste(xlabE, plotunit), cex = cex.lab, line = line)
 
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-    #   axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
     AxisTS(OutputsModel)
+
+    box()
   }
 
   ## ActuEvap
@@ -453,13 +444,9 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
 
     mtext(side = 2, paste("actu. evap.", plotunit), cex = cex.lab, line = line)
 
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-    #   axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
     AxisTS(OutputsModel)
+
+    box()
   }
 
 
@@ -491,14 +478,10 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
     legend("topright", legend = c("mean", "layers"), col = c("darkorchid4", "orchid"),
            lty = c(1, 3), lwd = c(lwd*1.0, lwd*0.8),
            bty = "o", bg = bg, box.col = bg, cex = cex.leg)
-    box()
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-    #   axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
+
     AxisTS(OutputsModel)
+
+    box()
   }
 
 
@@ -527,14 +510,10 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
     legend("topright", legend = c("mean", "layers"), col = c("royalblue", "royalblue"),
            lty = c(1, 3), lwd = c(lwd*1.2, lwd*0.8),
            bty = "o", bg = bg, box.col = bg, cex = cex.leg)
-    box()
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-    #   axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
+
     AxisTS(OutputsModel)
+
+    box()
   }
 
 
@@ -578,12 +557,6 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
       axis(side = 4, at = seqDATA1ba, labels = seqDATA2ba, cex.axis = cex.axis, ...)
       mtext(side = 4, paste("flow", "[m3/s]"), line = line, cex = cex.lab)
     }
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-    #   axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
     AxisTS(OutputsModel)
     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)
@@ -618,12 +591,6 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
       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)
     }
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-    #   axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
     AxisTS(OutputsModel)
     legend("topright", txtleg, col = colleg, lty = 1, lwd = lwd * lwdk , bty = "o", bg = bg, box.col = bg, cex = cex.leg)
     box()
@@ -654,16 +621,11 @@ plot.OutputsModel <- function(x, Qobs = NULL, IndPeriod_Plot = NULL, BasinArea =
       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)
     }
-    # if (BOOL_Dates) {
-    #   axis(side = 1, at = Seq1, labels = FALSE, cex.axis = cex.axis, ...)
-    #   axis(side = 1, at = Seq2, labels = Labels2, lwd.ticks = 1.5, cex.axis = cex.axis, ...)
-    # } else {
-    #   axis(side = 1, at = pretty(Xaxis), labels = pretty(Xaxis), cex.axis = cex.axis, ...)
-    # }
     AxisTS(OutputsModel)
     if (log_scale) {
       legend("bottomright", "log scale", lty = 1, col = NA, bty = "o", bg = bg, box.col = bg, cex = cex.leg)
     }
+    box()
   }