Forked from HYCAR-Hydro / airGR
1624 commits behind the upstream repository.
RunModel_CemaNeige.R 10.47 KiB
#*****************************************************************************************************************
#' Function which performs a single run for the CemaNeige daily snow module.
#'
#' For further details on the model, see the references section.
#' For further details on the argument structures and initialisation options, see \code{\link{CreateRunOptions}}.
#*****************************************************************************************************************
#' @title Run with the CemaNeige snow module
#' @author Laurent Coron (January 2014)
#' @references
#'   Valéry, A., V. Andréassian and C. Perrin (2014), 
#'       "As simple as possible but not simpler": what is useful in a temperature-based snow-accounting routine? 
#'       Part 1 - Comparison of six snow accounting routines on 380 catchments, Journal of Hydrology, doi:10.1016/j.jhydrol.2014.04.059. \cr
#'   Valéry, A., V. Andréassian and C. Perrin (2014), 
#'       "As simple as possible but not simpler": What is useful in a temperature-based snow-accounting routine? 
#'       Part 2 - Sensitivity analysis of the Cemaneige snow accounting routine on 380 catchments, Journal of Hydrology, doi:10.1016/j.jhydrol.2014.04.058.
#' @seealso \code{\link{RunModel_CemaNeigeGR4J}}, \code{\link{CreateInputsModel}}, \code{\link{CreateRunOptions}}.
#' @example tests/example_RunModel_CemaNeige.R
#' @useDynLib airgr
#' @encoding UTF-8
#' @export
#_FunctionInputs__________________________________________________________________________________________________
#' @param  InputsModel         [object of class \emph{InputsModel}] see \code{\link{CreateInputsModel}} for details
#' @param  RunOptions          [object of class \emph{RunOptions}] see \code{\link{CreateRunOptions}} for details
#' @param  Param               [numeric] vector of 2 parameters                                                             
#'                             \tabular{ll}{                                                                      
#'                             CemaNeige X1 \tab weighting coefficient for snow pack thermal state [-]         \cr
#'                             CemaNeige X2 \tab degree-day melt coefficient [mm/degC/d]                       \cr
#'                             }                                                                                  
#_FunctionOutputs_________________________________________________________________________________________________
#' @return  [list] list containing the function outputs organised as follows:                                         
#'          \tabular{ll}{                                                                                         
#'          \emph{$DatesR  }                                  \tab [POSIXlt] series of dates                                    \cr
#'          \emph{$CemaNeigeLayers}                           \tab [list] list of CemaNeige outputs (1 list per layer)          \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$Pliq         }   \tab [numeric] series of liquid precip. [mm/d]                    \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$Psol         }   \tab [numeric] series of solid precip. [mm/d]                     \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$SnowPack     }   \tab [numeric] series of snow pack [mm]                           \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$ThermalState }   \tab [numeric] series of snow pack thermal state [degC]           \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$Gratio       }   \tab [numeric] series of Gratio [0-1]                             \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$PotMelt      }   \tab [numeric] series of potential snow melt [mm]                 \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$Melt         }   \tab [numeric] series of actual snow melt [mm]                    \cr
#'          \emph{$CemaNeigeLayers[[iLayer]]$PliqAndMelt  }   \tab [numeric] series of liquid precip. + actual snow melt [mm]   \cr
#'          \emph{$StateEnd}                                  \tab [numeric] states at the end of the run: CemaNeige states [mm & degC] \cr
#'          }                                                                                                     
#'          (refer to the provided references or to the package source code for further details on these model outputs)
#*****************************************************************************************************************
RunModel_CemaNeige <- function(InputsModel,RunOptions,Param){
    NParam <- 2;
    FortranOutputsCemaNeige <- c("Pliq","Psol","SnowPack","ThermalState","Gratio","PotMelt","Melt","PliqAndMelt");
    ##Arguments_check
      if(inherits(InputsModel,"InputsModel")==FALSE){ stop("InputsModel must be of class 'InputsModel' \n"); return(NULL); }  
      if(inherits(InputsModel,"daily"      )==FALSE){ stop("InputsModel must be of class 'daily'       \n"); return(NULL); }  
      if(inherits(InputsModel,"CemaNeige"  )==FALSE){ stop("InputsModel must be of class 'CemaNeige'   \n"); return(NULL); }  
      if(inherits(RunOptions,"RunOptions"  )==FALSE){ stop("RunOptions must be of class 'RunOptions'   \n"); return(NULL); }  
      if(inherits(RunOptions,"CemaNeige"   )==FALSE){ stop("RunOptions must be of class 'CemaNeige'    \n"); return(NULL); }  
      if(!is.vector(Param)){ stop("Param must be a vector \n"); return(NULL); }
      if(sum(!is.na(Param))!=NParam){ stop(paste("Param must be a vector of length ",NParam," and contain no NA \n",sep="")); return(NULL); }
      Param <- as.double(Param);
    ##Input_data_preparation
      if(identical(RunOptions$IndPeriod_WarmUp,0)){ RunOptions$IndPeriod_WarmUp <- NULL; }
      IndPeriod1    <- c(RunOptions$IndPeriod_WarmUp,RunOptions$IndPeriod_Run);
      IndPeriod2    <- (length(RunOptions$IndPeriod_WarmUp)+1):length(IndPeriod1);
      ExportDatesR    <- "DatesR"   %in% RunOptions$Outputs_Sim;
      ExportStateEnd  <- "StateEnd" %in% RunOptions$Outputs_Sim;
    ##SNOW_MODULE________________________________________________________________________________##
7172737475767778798081828384858687888990919293949596979899100101102103104105106107108109110111112113114115116117118119120121122123124125126127128129130131132133
ParamCemaNeige <- Param; NLayers <- length(InputsModel$LayerPrecip); if(sum(is.na(ParamCemaNeige))!=0){ stop("Param contains missing values \n"); return(NULL); } if("all" %in% RunOptions$Outputs_Sim){ IndOutputsCemaNeige <- as.integer(1:length(FortranOutputsCemaNeige)); } else { IndOutputsCemaNeige <- which(FortranOutputsCemaNeige %in% RunOptions$Outputs_Sim); } CemaNeigeLayers <- list(); CemaNeigeStateEnd <- NULL; NameCemaNeigeLayers <- "CemaNeigeLayers"; ##Call_DLL_CemaNeige_________________________ for(iLayer in 1:NLayers){ StateStartCemaNeige <- RunOptions$IniStates[ (2*(iLayer-1)+1):(2*(iLayer-1)+2) ]; RESULTS <- .Fortran("frun_cemaneige",PACKAGE="airgr", ##inputs LInputs=as.integer(length(IndPeriod1)), ### length of input and output series InputsPrecip=InputsModel$LayerPrecip[[iLayer]][IndPeriod1], ### input series of total precipitation [mm/d] InputsFracSolidPrecip=InputsModel$LayerFracSolidPrecip[[iLayer]][IndPeriod1], ### input series of fraction of solid precipitation [0-1] InputsTemp=InputsModel$LayerTemp[[iLayer]][IndPeriod1], ### input series of air mean temperature [degC] MeanAnSolidPrecip=RunOptions$MeanAnSolidPrecip[iLayer], ### value of annual mean solid precip [mm/y] NParam=as.integer(2), ### number of model parameter = 2 Param=ParamCemaNeige, ### parameter set NStates=as.integer(2), ### number of state variables used for model initialising = 2 StateStart=StateStartCemaNeige, ### state variables used when the model run starts NOutputs=as.integer(length(IndOutputsCemaNeige)), ### number of output series IndOutputs=IndOutputsCemaNeige, ### indices of output series ##outputs Outputs=matrix(as.double(-999.999),nrow=length(IndPeriod1),ncol=length(IndOutputsCemaNeige)), ### output series [mm] StateEnd=rep(as.double(-999.999),as.integer(2)) ### state variables at the end of the model run (reservoir levels [mm] and HU) ) RESULTS$Outputs[ round(RESULTS$Outputs ,3)==(-999.999)] <- NA; RESULTS$StateEnd[round(RESULTS$StateEnd,3)==(-999.999)] <- NA; ##Data_storage CemaNeigeLayers[[iLayer]] <- lapply(seq_len(RESULTS$NOutputs), function(i) RESULTS$Outputs[IndPeriod2,i]); names(CemaNeigeLayers[[iLayer]]) <- FortranOutputsCemaNeige[IndOutputsCemaNeige]; if(ExportStateEnd){ CemaNeigeStateEnd <- c(CemaNeigeStateEnd,RESULTS$StateEnd); } rm(RESULTS); } ###ENDFOR_iLayer names(CemaNeigeLayers) <- paste("Layer",formatC(1:NLayers,width=2,flag="0"),sep=""); ##Output_data_preparation if(ExportDatesR==FALSE & ExportStateEnd==FALSE){ OutputsModel <- list(CemaNeigeLayers); names(OutputsModel) <- NameCemaNeigeLayers; } if(ExportDatesR==TRUE & ExportStateEnd==FALSE){ OutputsModel <- c( list(InputsModel$DatesR[RunOptions$IndPeriod_Run]), list(CemaNeigeLayers) ); names(OutputsModel) <- c("DatesR",NameCemaNeigeLayers); } if(ExportDatesR==FALSE & ExportStateEnd==TRUE){ OutputsModel <- c( list(CemaNeigeLayers), CemaNeigeStateEnd ); names(OutputsModel) <- c(NameCemaNeigeLayers,"StateEnd"); } if(ExportDatesR==TRUE & ExportStateEnd==TRUE){ OutputsModel <- c( list(InputsModel$DatesR[RunOptions$IndPeriod_Run]), list(CemaNeigeLayers), CemaNeigeStateEnd ); names(OutputsModel) <- c("DatesR",NameCemaNeigeLayers,"StateEnd"); } ##End class(OutputsModel) <- c("OutputsModel","daily","CemaNeige"); return(OutputsModel); }