37 REAL(KIND=8),
DIMENSION(:),
ALLOCATABLE ::
anoise 49 CHARACTER*4,
INTENT(IN),
OPTIONAL :: force
53 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 56 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 59 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 62 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 69 IF (
PRESENT(force))
THEN 85 stop
'*** MODE variable not properly defined ***' 97 REAL(KIND=8),
INTENT(IN) :: t
98 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y
99 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res
111 SUBROUTINE step(y,t,dt,dtn,res,tend)
112 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(IN) :: y
113 REAL(KIND=8),
INTENT(INOUT) :: t
114 REAL(KIND=8),
INTENT(IN) :: dt,dtn
115 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(OUT) :: res,tend
The stochastic models parameters module.
subroutine, public stoch_oc_unres_vec(dW)
routine to fill the unresolved oceanic component of a vector with standard gaussian noise process val...
real(kind=8) q_au
Atmospheric unresolved component noise amplitude.
integer ndim
Number of variables (dimension of the model)
subroutine, public stoch_atm_unres_vec(dW)
routine to fill the unresolved atmospheric component of a vector with standard gaussian noise process...
subroutine, public copy_coo(src, dst)
Routine to copy a coolist.
The resolved-unresolved components decomposition of the tensor.
type(coolist), dimension(:), allocatable, public byyy
Tensor holding the quadratic part of the unresolved tendencies involving unresolved variables...
real(kind=8) q_or
Oceanic resolved component noise amplitude.
subroutine, public init_integrator(force)
Subroutine to initialize the integrator.
subroutine, public stoch_atm_res_vec(dW)
routine to fill the resolved atmospheric component of a vector with standard gaussian noise process v...
The equation tensor for the coupled ocean-atmosphere model with temperature which allows for an exten...
subroutine, public sparse_mul3(coolist_ijk, arr_j, arr_k, res)
Sparse multiplication of a tensor with two vectors: .
real(kind=8), dimension(:), allocatable buf_y1
real(kind=8), dimension(:), allocatable dwou
Standard gaussian noise buffers.
real(kind=8), dimension(:), allocatable dwar
subroutine, public stoch_oc_res_vec(dW)
routine to fill the resolved oceanic component of a vector with standard gaussian noise process value...
Coordinate list. Type used to represent the sparse tensor.
real(kind=8), dimension(:), allocatable anoise
Additive noise term.
type(coolist), dimension(:), allocatable, public ff_tensor
Tensor holding the part of the unresolved tensor involving only unresolved variables.
real(kind=8) q_ou
Oceanic unresolved component noise amplitude.
type(coolist), dimension(:), allocatable int_tensor
Dummy tensor that will hold the tendencies tensor.
real(kind=8), dimension(:), allocatable dwor
subroutine, public step(y, t, dt, dtn, res, tend)
Routine to perform a stochastic step of the selected dynamics (Heun algorithm). The incremented time ...
integer natm
Number of atmospheric basis functions.
type(coolist), dimension(:), allocatable, public ss_tensor
Tensor holding the part of the resolved tensor involving only resolved variables. ...
real(kind=8), dimension(:), allocatable buf_f1
Integration buffers.
The model parameters module.
Utility module containing the stochastic related routines.
real(kind=8), dimension(:), allocatable buf_f0
type(coolist), dimension(:), allocatable, public aotensor
- Tensor representation of the tendencies.
character(len=4) mode
Stochastic mode parameter.
subroutine tendencies(t, y, res)
Routine computing the tendencies of the selected model.
real(kind=8) q_ar
Atmospheric resolved component noise amplitude.
Module with the stochastic rk2 integration routines.
real(kind=8), dimension(:), allocatable dwau