source: codes/icosagcm/devel/src/dynamics/compute_caldyn.f90 @ 915

Last change on this file since 915 was 884, checked in by dubos, 5 years ago

devel/unstructured : fixed etat0 + renamed compute => compute_caldyn

File size: 501 bytes
Line 
1MODULE compute_caldyn_mod
2  IMPLICIT NONE
3  SAVE
4
5  INTERFACE
6
7    SUBROUTINE comp_pvort_only(u,rhodz,qu,qv, hv_)
8      USE prec, ONLY : rstd
9      REAL(rstd),INTENT(IN)  :: u(1,1)
10      REAL(rstd),INTENT(INOUT) :: rhodz(1,1)
11      REAL(rstd),INTENT(OUT) :: qu(1,1)
12      REAL(rstd),INTENT(OUT) :: qv(1,1)
13      REAL(rstd),INTENT(OUT) :: hv_(1,1)
14    END SUBROUTINE comp_pvort_only
15
16  END INTERFACE
17
18  PROCEDURE(comp_pvort_only), POINTER :: compute_pvort_only => NULL()
19
20END MODULE compute_caldyn_mod
Note: See TracBrowser for help on using the repository browser.