30 REAL(KIND=8),
DIMENSION(:),
ALLOCATABLE ::
buf_y1 31 REAL(KIND=8),
DIMENSION(:),
ALLOCATABLE ::
buf_f0 32 REAL(KIND=8),
DIMENSION(:),
ALLOCATABLE ::
buf_f1 43 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 60 SUBROUTINE ad_step(y,ystar,t,dt,res)
61 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y,ystar
62 REAL(KIND=8),
INTENT(INOUT) :: t
63 REAL(KIND=8),
INTENT(IN) :: dt
64 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res
85 SUBROUTINE tl_step(y,ystar,t,dt,res)
86 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y,ystar
87 REAL(KIND=8),
INTENT(INOUT) :: t
88 REAL(KIND=8),
INTENT(IN) :: dt
89 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res
real(kind=8), dimension(:), allocatable buf_f1
Buffer to hold tendencies at the intermediate position of the tangent linear model.
integer ndim
Number of variables (dimension of the model)
Tangent Linear (TL) and Adjoint (AD) model versions of MAOOAM. Integrators module.
subroutine, public ad_step(y, ystar, t, dt, res)
Routine to perform an integration step (Heun algorithm) of the adjoint model. The incremented time is...
subroutine, public ad(t, ystar, deltay, buf)
Tendencies for the AD of MAOOAM in point ystar for perturbation deltay.
subroutine, public tl(t, ystar, deltay, buf)
Tendencies for the TL of MAOOAM in point ystar for perturbation deltay.
The model parameters module.
Tangent Linear (TL) and Adjoint (AD) model versions of MAOOAM. Tensors definition module...
real(kind=8), dimension(:), allocatable buf_y1
Buffer to hold the intermediate position (Heun algorithm) of the tangent linear model.
real(kind=8), dimension(:), allocatable buf_f0
Buffer to hold tendencies at the initial position of the tangent linear model.
subroutine, public init_tl_ad_integrator
Routine to initialise the integration buffers.
subroutine, public tl_step(y, ystar, t, dt, res)
Routine to perform an integration step (Heun algorithm) of the tangent linear model. The incremented time is returned.