UPP  V11.0.0
 All Data Structures Files Functions Pages
CALSTRM.f
Go to the documentation of this file.
1 
25  SUBROUTINE calstrm(Z1D,STRM)
26 
27 !
28 !
29 !
30 !
31 ! INCLUDE ETA GRID DIMENSIONS. SET/DERIVE OTHER PARAMETERS.
32 !
33 ! use vrbls2d, only:
34  use params_mod, only: g
35  use ctlblk_mod, only: jsta, jend, im, ista, iend
36 !- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
37  implicit none
38 !
39  real,PARAMETER :: omega=7.292e-5,twomg=2*omega
40 !
41 ! DECLARE VARIABLES.
42 !
43 ! LOGICAL FIRST,OLDRD,RESTRT,RUN,SIGMA,STRD
44  REAL, dimension(ista:iend,jsta:jend), intent(in) :: z1d
45  REAL, dimension(ista:iend,jsta:jend), intent(inout) :: strm
46 !
47  LOGICAL oldrd,strd
48  integer imid,i,j
49  real f0,gof0
50 !
51 !***************************************************************************
52 ! START CALSTRM HERE.
53 !
54 ! COMPUTE CORIOLIS PARAMETER AT 40N
55 !
56  imid=im/2
57  f0 = 1.454441e-4*sin(40.0*0.01745329)
58  gof0 = g/f0
59 !
60 ! COMPUTE GEOSTROPHIC STREAMFUNCTION.
61 !$omp parallel do
62  DO j=jsta,jend
63  DO i=ista,iend
64  strm(i,j) = gof0*z1d(i,j)
65  ENDDO
66  ENDDO
67 !
68 ! END OF ROUTINE.
69  RETURN
70  END