32 REAL(KIND=8) :: gasdev
33 REAL(KIND=8) :: fac,rsq,v1,v2,r
41 IF (rsq.lt.1.d0.and.rsq.ne.0.d0)
EXIT 43 fac=sqrt(-2.*log(rsq)/rsq)
57 REAL(KIND=8),
DIMENSION(0:ndim),
INTENT(INOUT) :: dW
67 real(kind=8),
dimension(0:ndim),
intent(inout) :: dW
77 real(kind=8),
dimension(0:ndim),
intent(inout) :: dW
88 real(kind=8),
dimension(0:ndim),
intent(inout) :: dW
99 real(kind=8),
dimension(0:ndim),
intent(inout) :: dW
109 real(kind=8),
dimension(0:ndim),
intent(inout) :: dW
120 real(kind=8),
dimension(0:ndim),
intent(inout) :: dW
subroutine, public stoch_oc_unres_vec(dW)
routine to fill the unresolved oceanic component of a vector with standard gaussian noise process val...
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...
real(kind=8) function, public gasdev()
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 stoch_oc_res_vec(dW)
routine to fill the resolved oceanic component of a vector with standard gaussian noise process value...
integer, dimension(:), allocatable, public sf
Unresolved variable definition vector.
integer natm
Number of atmospheric basis functions.
subroutine, public stoch_vec(dW)
Routine to fill a vector with standard Gaussian noise process values.
subroutine, public stoch_oc_vec(dW)
routine to fill the oceanic component of a vector with standard gaussian noise process values ...
The model parameters module.
Utility module containing the stochastic related routines.
subroutine, public stoch_atm_vec(dW)
routine to fill the atmospheric component of a vector with standard gaussian noise process values ...
Module to select the resolved-unresolved components.