/[MITgcm]/MITgcm/model/src/ini_theta.F
ViewVC logotype

Annotation of /MITgcm/model/src/ini_theta.F

Parent Directory Parent Directory | Revision Log Revision Log | View Revision Graph Revision Graph


Revision 1.15 - (hide annotations) (download)
Tue May 29 14:01:37 2001 UTC (23 years ago) by adcroft
Branch: MAIN
CVS Tags: checkpoint40pre3, checkpoint40pre1, checkpoint40pre7, checkpoint40pre6, checkpoint40pre9, checkpoint40pre8, checkpoint40pre2, checkpoint40pre4, checkpoint40pre5, checkpoint40
Changes since 1.14: +17 -46 lines
Merge from branch pre38:
 o essential mods for cubed sphere
 o debugged atmosphere, dynamcis + physics (aim)
 o new packages (mom_vecinv, mom_fluxform, ...)

1 adcroft 1.15 C $Header: /u/gcmpack/models/MITgcmUV/model/src/ini_theta.F,v 1.14.2.1 2001/03/16 18:03:59 adcroft Exp $
2     C $Name: $
3 cnh 1.1
4 cnh 1.9 #include "CPP_OPTIONS.h"
5 cnh 1.1
6     CStartOfInterface
7     SUBROUTINE INI_THETA( myThid )
8     C /==========================================================\
9     C | SUBROUTINE INI_THETA |
10     C | o Set model initial temperature field. |
11     C |==========================================================|
12     C | There are several options for setting the initial |
13     C | temperature file |
14     C | 1. Inline code |
15     C | 2. Vertical profile ( uniform T in X and Y ) |
16     C | 3. Three-dimensional data from a file. For example from |
17     C | Levitus or from a checkpoint file from a previous |
18     C | integration. |
19     C | In addition to setting the temperature field we also |
20     C | set the initial temperature tendency term here. |
21     C \==========================================================/
22 adcroft 1.11 IMPLICIT NONE
23 cnh 1.1
24     C === Global variables ===
25     #include "SIZE.h"
26     #include "EEPARAMS.h"
27     #include "PARAMS.h"
28     #include "GRID.h"
29     #include "DYNVARS.h"
30    
31     C == Routine arguments ==
32     C myThid - Number of this instance of INI_THETA
33     INTEGER myThid
34     CEndOfInterface
35    
36     C == Local variables ==
37     C iC, jC - Center of domain
38     C iD, jD - Disitance from domain center.
39     C rad - Radius of initial patch
40     C rD - Radial displacement of point I,J
41     C iG, jG - Global coordinate index
42     C bi,bj - Loop counters
43     C I,J,K
44     INTEGER iC, jC, iD, jD
45     INTEGER iG, jG
46     INTEGER bi, bj
47 adcroft 1.13 INTEGER I, J, K, localWarnings
48 adcroft 1.12 _RL rad, rD
49 adcroft 1.13 CHARACTER*(MAX_LEN_MBUF) msgBuf
50 cnh 1.1
51 adcroft 1.15 C-- Initialise temperature field to the vertical reference profile
52     DO bj = myByLo(myThid), myByHi(myThid)
53     DO bi = myBxLo(myThid), myBxHi(myThid)
54     DO K=1,Nr
55     DO J=1-Oly,sNy+Oly
56     DO I=1-Olx,sNx+Olx
57     theta(I,J,K,bi,bj) = tRef(K)
58 cnh 1.1 ENDDO
59     ENDDO
60     ENDDO
61     ENDDO
62 adcroft 1.15 ENDDO
63    
64     IF ( hydrogThetaFile .NE. ' ' ) THEN
65 cnh 1.3 _BEGIN_MASTER( myThid )
66 cnh 1.4 CALL READ_FLD_XYZ_RL( hydrogThetaFile, ' ', theta, 0, myThid )
67 cnh 1.3 _END_MASTER(myThid)
68 adcroft 1.15 _EXCH_XYZ_R8(theta,myThid)
69 cnh 1.3 ENDIF
70 adcroft 1.15
71     C Apply mask and test consistancy
72 adcroft 1.13 localWarnings=0
73 cnh 1.1 DO bj = myByLo(myThid), myByHi(myThid)
74     DO bi = myBxLo(myThid), myBxHi(myThid)
75 cnh 1.7 DO K=1,Nr
76 cnh 1.1 DO J=1,sNy
77     DO I=1,sNx
78 adcroft 1.10 IF (hFacC(I,J,K,bi,bj).EQ.0) theta(I,J,K,bi,bj) = 0.
79 adcroft 1.15 IF (hFacC(I,J,K,bi,bj).NE.0.AND.theta(I,J,K,bi,bj).EQ.0.
80     & .AND. tRef(k).NE.0.) THEN
81 adcroft 1.13 localWarnings=localWarnings+1
82     ENDIF
83 cnh 1.1 ENDDO
84     ENDDO
85     ENDDO
86     ENDDO
87     ENDDO
88 adcroft 1.13 IF (localWarnings.NE.0) THEN
89     WRITE(msgBuf,'(A,A)')
90     & 'S/R INI_THETA: theta = 0 identically. If this is intentional',
91     & 'you will need to edit ini_theta.F to avoid this safety check'
92     CALL PRINT_ERROR( msgBuf , myThid)
93     STOP 'ABNORMAL END: S/R INI_THETA'
94     ENDIF
95 cnh 1.5
96 cnh 1.8 CALL PLOT_FIELD_XYZRL( theta, 'Initial Temperature' ,
97     & Nr, 1, myThid )
98 cnh 1.5
99 cnh 1.1 RETURN
100     END

  ViewVC Help
Powered by ViewVC 1.1.22