UPP (develop)
Loading...
Searching...
No Matches
CALSTRM.f
Go to the documentation of this file.
1
25!-----------------------------------------------------------------------
30!-----------------------------------------------------------------------
31 SUBROUTINE calstrm(Z1D,STRM)
32
33!
34!
35!
36!
37! INCLUDE ETA GRID DIMENSIONS. SET/DERIVE OTHER PARAMETERS.
38!
39! use vrbls2d, only:
40 use params_mod, only: g
41 use ctlblk_mod, only: jsta, jend, im, ista, iend
42!- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
43 implicit none
44!
45 real,PARAMETER :: OMEGA=7.292e-5,twomg=2*omega
46!
47! DECLARE VARIABLES.
48!
49! LOGICAL FIRST,OLDRD,RESTRT,RUN,SIGMA,STRD
50 REAL, dimension(ista:iend,jsta:jend), intent(in) :: Z1D
51 REAL, dimension(ista:iend,jsta:jend), intent(inout) :: STRM
52!
53 LOGICAL OLDRD,STRD
54 integer IMID,I,J
55 real f0,gof0
56!
57!***************************************************************************
58! START CALSTRM HERE.
59!
60! COMPUTE CORIOLIS PARAMETER AT 40N
61!
62 imid=im/2
63 f0 = 1.454441e-4*sin(40.0*0.01745329)
64 gof0 = g/f0
65!
66! COMPUTE GEOSTROPHIC STREAMFUNCTION.
67!$omp parallel do
68 DO j=jsta,jend
69 DO i=ista,iend
70 strm(i,j) = gof0*z1d(i,j)
71 ENDDO
72 ENDDO
73!
74! END OF ROUTINE.
75 RETURN
76 END
subroutine calstrm(z1d, strm)
Subroutine that computes geo streamfunction.
Definition CALSTRM.f:32