etrans_release.F90 Source File


This file depends on

sourcefile~~etrans_release.f90~~EfferentGraph sourcefile~etrans_release.f90 etrans_release.F90 sourcefile~edealloc_resol_mod.f90 edealloc_resol_mod.F90 sourcefile~etrans_release.f90->sourcefile~edealloc_resol_mod.f90 sourcefile~eset_resol_mod.f90 eset_resol_mod.F90 sourcefile~edealloc_resol_mod.f90->sourcefile~eset_resol_mod.f90 sourcefile~tpm_distr.f90 tpm_distr.F90 sourcefile~edealloc_resol_mod.f90->sourcefile~tpm_distr.f90 sourcefile~tpm_fftw.f90 tpm_fftw.F90 sourcefile~edealloc_resol_mod.f90->sourcefile~tpm_fftw.f90 sourcefile~tpm_fields.f90 tpm_fields.F90 sourcefile~edealloc_resol_mod.f90->sourcefile~tpm_fields.f90 sourcefile~tpm_flt.f90 tpm_flt.F90 sourcefile~edealloc_resol_mod.f90->sourcefile~tpm_flt.f90 sourcefile~tpm_gen.f90 tpm_gen.F90 sourcefile~edealloc_resol_mod.f90->sourcefile~tpm_gen.f90 sourcefile~tpm_geometry.f90 tpm_geometry.F90 sourcefile~edealloc_resol_mod.f90->sourcefile~tpm_geometry.f90 sourcefile~eset_resol_mod.f90->sourcefile~tpm_distr.f90 sourcefile~eset_resol_mod.f90->sourcefile~tpm_fftw.f90 sourcefile~eset_resol_mod.f90->sourcefile~tpm_fields.f90 sourcefile~eset_resol_mod.f90->sourcefile~tpm_gen.f90 sourcefile~eset_resol_mod.f90->sourcefile~tpm_geometry.f90 sourcefile~abort_trans_mod.f90 abort_trans_mod.F90 sourcefile~eset_resol_mod.f90->sourcefile~abort_trans_mod.f90 sourcefile~tpm_dim.f90 tpm_dim.F90 sourcefile~eset_resol_mod.f90->sourcefile~tpm_dim.f90 sourcefile~tpmald_dim.f90 tpmald_dim.F90 sourcefile~eset_resol_mod.f90->sourcefile~tpmald_dim.f90 sourcefile~tpmald_distr.f90 tpmald_distr.F90 sourcefile~eset_resol_mod.f90->sourcefile~tpmald_distr.f90 sourcefile~tpmald_fields.f90 tpmald_fields.F90 sourcefile~eset_resol_mod.f90->sourcefile~tpmald_fields.f90 sourcefile~tpmald_geo.f90 tpmald_geo.F90 sourcefile~eset_resol_mod.f90->sourcefile~tpmald_geo.f90 sourcefile~parkind_ectrans.f90 parkind_ectrans.F90 sourcefile~tpm_flt.f90->sourcefile~parkind_ectrans.f90 sourcefile~seefmm_mix.f90 seefmm_mix.F90 sourcefile~tpm_flt.f90->sourcefile~seefmm_mix.f90 sourcefile~abort_trans_mod.f90->sourcefile~tpm_gen.f90 sourcefile~seefmm_mix.f90->sourcefile~parkind_ectrans.f90 sourcefile~wts500_mod.f90 wts500_mod.F90 sourcefile~seefmm_mix.f90->sourcefile~wts500_mod.f90

Source Code

! (C) Copyright 2001- ECMWF.
! (C) Copyright 2001- Meteo-France.
! 
! This software is licensed under the terms of the Apache Licence Version 2.0
! which can be obtained at http://www.apache.org/licenses/LICENSE-2.0.
! In applying this licence, ECMWF does not waive the privileges and immunities
! granted to it by virtue of its status as an intergovernmental organisation
! nor does it submit to any jurisdiction.
! 


SUBROUTINE ETRANS_RELEASE(KRESOL)

!**** *ETRANS_RELEASE* - release a spectral resolution

!     Purpose.
!     --------
!      Release all arrays related to a given resolution tag

!**   Interface.
!     ----------
!     CALL ETRANS_RELEASE

!     Explicit arguments : KRESOL : resolution tag
!     --------------------

!     Method.
!     -------

!     Externals.  None
!     ----------

!     Author.
!     -------
!        R. El Khatib *METEO-FRANCE*

!     Modifications.
!     --------------
!        Original : 09-Jul-2013

!     ------------------------------------------------------------------

USE PARKIND1  ,ONLY : JPIM

!ifndef INTERFACE

USE EDEALLOC_RESOL_MOD   ,ONLY : EDEALLOC_RESOL
!

IMPLICIT NONE

INTEGER(KIND=JPIM),INTENT(IN) :: KRESOL

!endif INTERFACE

!     ------------------------------------------------------------------

CALL EDEALLOC_RESOL(KRESOL)

!     ------------------------------------------------------------------

END SUBROUTINE ETRANS_RELEASE