Commit aad9d1db authored by Dorchies David's avatar Dorchies David
Browse files

feat: add WarmUpQsim item in OutputsModel

- add the item in the OutputsModel object
- optimisation of CreateRunOptions on Outputs_Sim and Outputs_Cal items.
- add exception in SeriesAggreg.OutputsModel

Refs #123
Showing with 17 additions and 40 deletions
+17 -40
...@@ -295,31 +295,7 @@ CreateRunOptions <- function(FUN_MOD, InputsModel, ...@@ -295,31 +295,7 @@ CreateRunOptions <- function(FUN_MOD, InputsModel,
##check_Outputs_Cal_and_Sim ##check_Outputs_Cal_and_Sim
##Outputs_all ##Outputs_all
Outputs_all <- NULL Outputs_all <- c("DatesR", unlist(FortranOutputs), "WarmUpQsim", "StateEnd")
if (identical(FUN_MOD, RunModel_GR4H) | identical(FUN_MOD, RunModel_CemaNeigeGR4H)) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = "GR4H")$GR)
}
if (identical(FUN_MOD, RunModel_GR5H) | identical(FUN_MOD, RunModel_CemaNeigeGR5H)) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = "GR5H")$GR)
}
if (identical(FUN_MOD, RunModel_GR4J) | identical(FUN_MOD, RunModel_CemaNeigeGR4J)) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = "GR4J")$GR)
}
if (identical(FUN_MOD, RunModel_GR5J) | identical(FUN_MOD, RunModel_CemaNeigeGR5J)) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = "GR5J")$GR)
}
if (identical(FUN_MOD, RunModel_GR6J) | identical(FUN_MOD, RunModel_CemaNeigeGR6J)) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = "GR6J")$GR)
}
if (identical(FUN_MOD, RunModel_GR2M)) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = "GR2M")$GR)
}
if (identical(FUN_MOD, RunModel_GR1A)) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = "GR1A")$GR)
}
if ("CemaNeige" %in% ObjectClass) {
Outputs_all <- c(Outputs_all, .FortranOutputs(GR = NULL, isCN = TRUE)$CN)
}
##check_Outputs_Sim ##check_Outputs_Sim
if (!is.vector(Outputs_Sim)) { if (!is.vector(Outputs_Sim)) {
...@@ -332,9 +308,9 @@ CreateRunOptions <- function(FUN_MOD, InputsModel, ...@@ -332,9 +308,9 @@ CreateRunOptions <- function(FUN_MOD, InputsModel,
stop("'Outputs_Sim' must not contain NA") stop("'Outputs_Sim' must not contain NA")
} }
if ("all" %in% Outputs_Sim) { if ("all" %in% Outputs_Sim) {
Outputs_Sim <- c("DatesR", Outputs_all, "StateEnd") Outputs_Sim <- Outputs_all
} }
Test <- which(!Outputs_Sim %in% c("DatesR", Outputs_all, "StateEnd")) Test <- which(!Outputs_Sim %in% Outputs_all)
if (length(Test) != 0) { if (length(Test) != 0) {
stop(paste0( "'Outputs_Sim' is incorrectly defined: ", stop(paste0( "'Outputs_Sim' is incorrectly defined: ",
paste(Outputs_Sim[Test], collapse = ", "), " not found")) paste(Outputs_Sim[Test], collapse = ", "), " not found"))
...@@ -342,7 +318,7 @@ CreateRunOptions <- function(FUN_MOD, InputsModel, ...@@ -342,7 +318,7 @@ CreateRunOptions <- function(FUN_MOD, InputsModel,
Outputs_Sim <- Outputs_Sim[!duplicated(Outputs_Sim)] Outputs_Sim <- Outputs_Sim[!duplicated(Outputs_Sim)]
##check_Outputs_Cal ##check_Outputs_Cal
if (is.null(Outputs_Cal)) { if (is.null(Outputs_Cal)) {
if ("GR" %in% ObjectClass) { if ("GR" %in% ObjectClass) {
Outputs_Cal <- c("Qsim") Outputs_Cal <- c("Qsim")
...@@ -366,10 +342,9 @@ CreateRunOptions <- function(FUN_MOD, InputsModel, ...@@ -366,10 +342,9 @@ CreateRunOptions <- function(FUN_MOD, InputsModel,
} }
} }
if ("all" %in% Outputs_Cal) { if ("all" %in% Outputs_Cal) {
Outputs_Cal <- c("DatesR", Outputs_all, "StateEnd") Outputs_Cal <- Outputs_all
} }
Test <- which(!Outputs_Cal %in% c("DatesR", Outputs_all, "StateEnd")) Test <- which(!Outputs_Cal %in% Outputs_all)
if (length(Test) != 0) { if (length(Test) != 0) {
stop(paste0("'Outputs_Cal' is incorrectly defined: ", stop(paste0("'Outputs_Cal' is incorrectly defined: ",
paste(Outputs_Cal[Test], collapse = ", "), " not found")) paste(Outputs_Cal[Test], collapse = ", "), " not found"))
......
...@@ -2,6 +2,6 @@ SeriesAggreg.OutputsModel <- function(x, Format, ...) { ...@@ -2,6 +2,6 @@ SeriesAggreg.OutputsModel <- function(x, Format, ...) {
SeriesAggreg.list(x, SeriesAggreg.list(x,
Format, Format,
ConvertFun = NA, ConvertFun = NA,
except = "StateEnd", except = c("WarmUpQsim", "StateEnd"),
...) ...)
} }
...@@ -18,15 +18,11 @@ ...@@ -18,15 +18,11 @@
IndPeriod2 <- (length(RunOptions$IndPeriod_WarmUp)+1):LInputSeries IndPeriod2 <- (length(RunOptions$IndPeriod_WarmUp)+1):LInputSeries
FortranOutputs <- RunOptions$FortranOutputs$GR FortranOutputs <- RunOptions$FortranOutputs$GR
if ("all" %in% RunOptions$Outputs_Sim) { IndOutputs <- which(FortranOutputs %in% RunOptions$Outputs_Sim)
IndOutputs <- as.integer(1:length(FortranOutputs))
} else {
IndOutputs <- which(FortranOutputs %in% RunOptions$Outputs_Sim)
}
OutputsModel <- list() OutputsModel <- list()
if("DatesR" %in% RunOptions$Outputs_Sim) { if ("DatesR" %in% RunOptions$Outputs_Sim) {
OutputsModel$DatesR <- InputsModel$DatesR[RunOptions$IndPeriod_Run] OutputsModel$DatesR <- InputsModel$DatesR[RunOptions$IndPeriod_Run]
} }
...@@ -36,11 +32,17 @@ ...@@ -36,11 +32,17 @@
OutputsModel <- c(OutputsModel, OutputsModel <- c(OutputsModel,
lapply(seqOutputs, function(i) RESULTS$Outputs[IndPeriod2, i])) lapply(seqOutputs, function(i) RESULTS$Outputs[IndPeriod2, i]))
if(!is.null(CemaNeigeLayers)) { if (!is.null(CemaNeigeLayers)) {
OutputsModel$CemaNeigeLayers <- CemaNeigeLayers OutputsModel$CemaNeigeLayers <- CemaNeigeLayers
} }
if("StateEnd" %in% RunOptions$Outputs_Sim) { if ("WarmUpQsim" %in% RunOptions$Outputs_Sim) {
OutputsModel$WarmUpQsim <- RESULTS$Outputs[seq_len(length(RunOptions$IndPeriod_WarmUp)),
which(FortranOutputs == "Qsim")]
class(OutputsModel$WarmUpQsim) <- c("WarmUpOutputsModelItem", class(OutputsModel$WarmUpQsim))
}
if ("StateEnd" %in% RunOptions$Outputs_Sim) {
OutputsModel$StateEnd <- RESULTS$StateEnd OutputsModel$StateEnd <- RESULTS$StateEnd
} }
......
Supports Markdown
0% or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment