22 REAL(KIND=8),
DIMENSION(:,:),
ALLOCATABLE :: dumb
24 INTEGER,
DIMENSION(:),
ALLOCATABLE :: ind,rind
36 print*,
'full version' 43 print*,
'inv_corr_i_full' 46 print*,
'inversion test' 49 print*,
'corrint full' 52 print*,
'inv_corr_i_full*corrint full' 59 print*,
'reduced part' 69 print*,
'inversion test' 76 print*,
'inv_corr_i*corrint' integer ndim
Number of variables (dimension of the model)
real(kind=8), dimension(:,:), allocatable, public corr_i_full
Covariance matrix of the unresolved variables (full version)
subroutine, public comp_corrint
Routine that actually compute or load the integrals.
real(kind=8), dimension(:,:), allocatable, public corrint
Matrix holding the integral of the correlation matrix.
The resolved-unresolved components decomposition of the tensor.
real(kind=8), dimension(:), allocatable, public mean_full
Vector holding the mean of the unresolved dynamics (full version)
subroutine, public printmat(A)
The equation tensor for the coupled ocean-atmosphere model with temperature which allows for an exten...
real(kind=8), dimension(:), allocatable, public mean
Vector holding the mean of the unresolved dynamics (reduced version)
type(coolist4), dimension(:), allocatable, public corr2int
Tensor holding the integral of the correlation outer product with itself.
subroutine, public reduce(A, Ared, n, ind, rind)
subroutine, public init_corrint
Subroutine to initialise the integrated matrices and tensors.
program test_corr
Small program to print the correlation and covariance matrices.
real(kind=8), dimension(:,:), allocatable, public inv_corr_i_full
Inverse of the covariance matrix of the unresolved variables (full version)
subroutine, public print_tensor4(t)
Routine to print a rank-4 tensor coolist.
Module to initialize the correlation matrix of the unresolved variables.
real(kind=8), dimension(:,:), allocatable, public corr_i
Covariance matrix of the unresolved variables (reduced version)
The model parameters module.
real(kind=8), dimension(:,:), allocatable, public inv_corr_i
Inverse of the covariance matrix of the unresolved variables (reduced version)
subroutine, public init_dec_tensor
Subroutine that initialize and compute the decomposed tensors.
Module to compute or load the integrals of the correlation matrices.
subroutine, public init_aotensor
Subroutine to initialise the aotensor tensor.