28 REAL(KIND=8),
DIMENSION(:),
ALLOCATABLE ::
dwar,
dwor 30 REAL(KIND=8),
DIMENSION(:),
ALLOCATABLE ::
anoise 43 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 46 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 49 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 63 REAL(KIND=8),
INTENT(IN) :: t
64 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y
65 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res
76 REAL(KIND=8),
INTENT(IN) :: t
77 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y,ys
78 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res
91 SUBROUTINE ss_step(y,ys,t,dt,dtn,res)
92 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y,ys
93 REAL(KIND=8),
INTENT(INOUT) :: t
94 REAL(KIND=8),
INTENT(IN) :: dt,dtn
95 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res
117 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y,ys
118 REAL(KIND=8),
INTENT(INOUT) :: t
119 REAL(KIND=8),
INTENT(IN) :: dt,dtn
120 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res
The stochastic models parameters module.
real(kind=8) q_au
Atmospheric unresolved component noise amplitude.
integer ndim
Number of variables (dimension of the model)
The resolved-unresolved components decomposition of the tensor.
subroutine, public tendencies(t, y, res)
Routine computing the tendencies of the uncoupled resolved model.
real(kind=8) q_or
Oceanic resolved component noise amplitude.
subroutine, public stoch_atm_res_vec(dW)
routine to fill the resolved atmospheric component of a vector with standard gaussian noise process v...
subroutine, public ss_tl_step(y, ys, t, dt, dtn, res)
Routine to perform a stochastic integration step of the unresolved uncoupled tangent linear dynamics ...
real(kind=8), dimension(:), allocatable dwor
Standard gaussian noise buffers.
subroutine, public ss_step(y, ys, t, dt, dtn, res)
Routine to perform a stochastic integration step of the unresolved uncoupled dynamics (Heun algorithm...
subroutine, public sparse_mul3(coolist_ijk, arr_j, arr_k, res)
Sparse multiplication of a tensor with two vectors: .
subroutine, public init_ss_integrator
Subroutine to initialize the uncoupled resolved rk2 integrator.
real(kind=8), dimension(:), allocatable buf_f1
Integration buffers.
real(kind=8), dimension(:), allocatable buf_f0
Module with the stochastic uncoupled resolved nonlinear and tangent linear rk2 dynamics integration r...
type(coolist), dimension(:), allocatable, public ss_tl_tensor
Tensor of the tangent linear model tendencies of the resolved component alone.
subroutine, public stoch_oc_res_vec(dW)
routine to fill the resolved oceanic component of a vector with standard gaussian noise process value...
real(kind=8), dimension(:), allocatable dwar
subroutine, public tl_tendencies(t, y, ys, res)
Tendencies for the tangent linear model of the uncoupled resolved dynamics in point ystar for perturb...
real(kind=8) q_ou
Oceanic unresolved component noise amplitude.
integer natm
Number of atmospheric basis functions.
real(kind=8), dimension(:), allocatable buf_y1
type(coolist), dimension(:), allocatable, public ss_tensor
Tensor holding the part of the resolved tensor involving only resolved variables. ...
The model parameters module.
Utility module containing the stochastic related routines.
real(kind=8), dimension(:), allocatable anoise
Additive noise term.
real(kind=8) q_ar
Atmospheric resolved component noise amplitude.