sufft_mod.F90 Source File


This file depends on

sourcefile~~sufft_mod.f90~~EfferentGraph sourcefile~sufft_mod.f90 sufft_mod.F90 sourcefile~tpm_dim.f90 tpm_dim.F90 sourcefile~sufft_mod.f90->sourcefile~tpm_dim.f90 sourcefile~tpm_distr.f90 tpm_distr.F90 sourcefile~sufft_mod.f90->sourcefile~tpm_distr.f90 sourcefile~tpm_gen.f90 tpm_gen.F90 sourcefile~sufft_mod.f90->sourcefile~tpm_gen.f90

Files dependent on this one

sourcefile~~sufft_mod.f90~~AfferentGraph sourcefile~sufft_mod.f90 sufft_mod.F90 sourcefile~setup_trans.f90~2 setup_trans.F90 sourcefile~setup_trans.f90~2->sourcefile~sufft_mod.f90

Source Code

! (C) Copyright 2000- ECMWF.
! (C) Copyright 2000- Meteo-France.
! (C) Copyright 2022- NVIDIA.
! 
! 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.
!

MODULE SUFFT_MOD
  CONTAINS
  SUBROUTINE SUFFT

  USE PARKIND1,     ONLY: JPIM
  USE TPM_DIM,      ONLY: R
  USE TPM_GEN,      ONLY: NOUT, NPRINTLEV
  USE TPM_DISTR,    ONLY: D
  !

  IMPLICIT NONE

  INTEGER(KIND=JPIM) :: JGL,IGLG
  LOGICAL :: LLP1,LLP2

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

  IF(.NOT.D%LGRIDONLY) THEN

    LLP1 = NPRINTLEV>0
    LLP2 = NPRINTLEV>1
    IF(LLP1) WRITE(NOUT,*) '=== ENTER ROUTINE SUFFT ==='

  ENDIF

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

  9 FORMAT(1X,'ARRAY ',A10,' ALLOCATED ',8I8)

  END SUBROUTINE SUFFT
END MODULE SUFFT_MOD