diff --git a/man/RunModel_Lag.Rd b/man/RunModel_Lag.Rd
index 68c41a2b614aec16dc8462f9a9f8b98ab1043586..c8bb7ea4bca6bdacc8439a6f05c50b5a90212670 100644
--- a/man/RunModel_Lag.Rd
+++ b/man/RunModel_Lag.Rd
@@ -42,27 +42,26 @@ The list value contains an extra item named \code{QsimDown} which is a copy of \
 ## Simulation of a reservoir with a purpose of low-flow mitigation ##
 #####################################################################
 
-## Preparation of the InputsModel object
+## ---- preparation of the InputsModel object
 
-# loading package and catchment data
+## loading package and catchment data
 library(airGR)
 data(L0123001)
 
-# The reservoir withdraws 1 m3/s when it's possible considering the flow observed in the basin
-Qupstream <- matrix(- unlist(lapply(BasinObs$Qls / 1000 - 1, function(x) {
-  min(1, max(0,x, na.rm = TRUE))
-})), ncol = 1)
+## the reservoir withdraws 1 m3/s when it's possible considering the flow observed in the basin
+Qupstream <- matrix(-sapply(BasinObs$Qls / 1000 - 1, function(x) {
+  min(1, max(0, x, na.rm = TRUE))
+}), ncol = 1)
 
-# Except between July and September when the reservoir releases 3 m3/s for low-flow mitigation
-month <- as.numeric(format(BasinObs$DatesR,"\%m"))
+## except between July and September when the reservoir releases 3 m3/s for low-flow mitigation
+month <- as.numeric(format(BasinObs$DatesR, "\%m"))
 Qupstream[month >= 7 & month <= 9] <- 3
-# Conversion in m3/day
-Qupstream <- Qupstream * 86400
+Qupstream <- Qupstream * 86400 ## Conversion in m3/day
 
-# The reservoir is not an upstream subcachment: its areas is NA
+## the reservoir is not an upstream subcachment: its areas is NA
 BasinAreas <- c(NA, BasinInfo$BasinArea)
 
-# Delay time between the reservoir and the catchment outlet is 2 days and the distance is 150 km
+## delay time between the reservoir and the catchment outlet is 2 days and the distance is 150 km
 LengthHydro <- 150000
 
 InputsModel <- CreateInputsModel(FUN_MOD = RunModel_GR4J, DatesR = BasinObs$DatesR,
@@ -70,32 +69,33 @@ InputsModel <- CreateInputsModel(FUN_MOD = RunModel_GR4J, DatesR = BasinObs$Date
                                  Qupstream = Qupstream, LengthHydro = LengthHydro,
                                  BasinAreas = BasinAreas)
 
-## Simulation of the basin with the reservoir influence
 
-# Run period selection
+## ---- simulation of the basin with the reservoir influence
+
+## run period selection
 Ind_Run <- seq(which(format(BasinObs$DatesR, format = "\%Y-\%m-\%d")=="1990-01-01"),
                which(format(BasinObs$DatesR, format = "\%Y-\%m-\%d")=="1999-12-31"))
 
-# Creation of the RunOptions object
+## creation of the RunOptions object
 RunOptions <- CreateRunOptions(FUN_MOD = RunModel_GR4J,
                                InputsModel = InputsModel, IndPeriod_Run = Ind_Run)
 
-# Simulation of the runoff of the catchment with a GR4J model
+## simulation of the runoff of the catchment with a GR4J model
 Param <- c(X1 = 257.238, X2 = 1.012, X3 = 88.235, X4 = 2.208)
 OutputsModelDown <- RunModel_GR4J(InputsModel = InputsModel,
                                   RunOptions = RunOptions, Param = Param)
 
-# With a delay of 2 days for 150 km, the flow velocity is 75 km per day
-Velocity <- (LengthHydro / 2) / 86400 # Conversion m/day -> m/s
+## with a delay of 2 days for 150 km, the flow velocity is 75 km per day
+Velocity <- (LengthHydro / 2) / 86400 ## Conversion m/day -> m/s
 
-# Add the output of the precipitation-runoff model in the InputsModel object
+## add the output of the precipitation-runoff model in the InputsModel object
 InputsModel$OutputsModel <- OutputsModelDown
 
-# Run the lag model which routes precipitation-runoff model and upstream flows
+## run the lag model which routes precipitation-runoff model and upstream flows
 OutputsModel <- RunModel_Lag(InputsModel = InputsModel,
                              RunOptions = RunOptions, Param = Velocity)
 
-## Results preview of comparison between naturalised (observed) and influenced flow (simulated)
+## results preview of comparison between naturalised (observed) and influenced flow (simulated)
 plot(OutputsModel, Qobs = OutputsModel$QsimDown)
 }