/[MITgcm]/MITgcm/pkg/ptracers/ptracers_readparms.F
ViewVC logotype

Annotation of /MITgcm/pkg/ptracers/ptracers_readparms.F

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


Revision 1.12 - (hide annotations) (download)
Thu Oct 28 00:32:21 2004 UTC (19 years, 7 months ago) by jmc
Branch: MAIN
CVS Tags: checkpoint56, checkpoint55i_post, checkpoint55j_post
Changes since 1.11: +43 -1 lines
print out ptracers parameters

1 jmc 1.12 C $Header: /u/gcmpack/MITgcm/pkg/ptracers/ptracers_readparms.F,v 1.11 2004/10/22 16:01:20 jmc Exp $
2 dimitri 1.2 C $Name: $
3 adcroft 1.1
4     #include "PTRACERS_OPTIONS.h"
5    
6 edhill 1.6 C---+----1----+----2----+----3----+----4----+----5----+----6----+----7-|--+----|
7 adcroft 1.1 CBOP
8 edhill 1.6 C !ROUTINE: PTRACERS_READPARMS
9    
10     C !INTERFACE:
11 adcroft 1.1 SUBROUTINE PTRACERS_READPARMS( myThid )
12 edhill 1.6
13     C !DESCRIPTION:
14 adcroft 1.1 C Initialize PTRACERS parameters, read in data.ptracers
15    
16 edhill 1.6 C !USES:
17 adcroft 1.1 IMPLICIT NONE
18     #include "SIZE.h"
19     #include "EEPARAMS.h"
20 jmc 1.5 #include "PTRACERS_SIZE.h"
21 adcroft 1.1 #include "PTRACERS.h"
22 dimitri 1.2 #include "PARAMS.h"
23 edhill 1.7
24 edhill 1.6 C !INPUT PARAMETERS:
25 adcroft 1.1 INTEGER myThid
26 edhill 1.6 CEOP
27 adcroft 1.1
28     #ifdef ALLOW_PTRACERS
29    
30 edhill 1.6 C !LOCAL VARIABLES:
31 jmc 1.11 C k,iTracer :: loop indices
32 edhill 1.6 C iUnit :: unit number for I/O
33     C msgBuf :: message buffer
34 jmc 1.11 INTEGER k, iTracer
35 adcroft 1.1 INTEGER iUnit
36 edhill 1.6 INTEGER ic
37 adcroft 1.1 CHARACTER*(MAX_LEN_MBUF) msgBuf
38 jmc 1.11 _RL PTRACERS_diffKr(PTRACERS_num)
39 adcroft 1.1
40 jmc 1.5 C PTRACERS_taveFreq :: Frequency with which time-averaged PTRACERS
41     C are written to post-processing files.
42     NAMELIST /PTRACERS_PARM01/
43 edhill 1.6 & PTRACERS_taveFreq,
44     & PTRACERS_advScheme,
45     & PTRACERS_diffKh,
46     & PTRACERS_diffK4,
47     & PTRACERS_diffKr,
48 jmc 1.11 & PTRACERS_diffKrNr,
49 edhill 1.6 & PTRACERS_useGMRedi,
50     & PTRACERS_useKPP,
51     & PTRACERS_numInUse,
52     & PTRACERS_initialFile,
53     & PTRACERS_useRecords,
54     & PTRACERS_names,
55     & PTRACERS_long_names,
56     & PTRACERS_units,
57 edhill 1.7 & PTRACERS_read_mnc,
58     & PTRACERS_write_mnc
59 jmc 1.5
60 edhill 1.6 C This routine has been called by the main model so we set our
61     C internal flag to indicate we are in business
62 adcroft 1.1 PTRACERSisON=.TRUE.
63    
64 edhill 1.6 C Set defaults values for parameters in PTRACERS.h
65 dimitri 1.4 PTRACERS_taveFreq=taveFreq
66 adcroft 1.1 PTRACERS_numInUse=-1
67     DO iTracer=1,PTRACERS_num
68 edhill 1.6 PTRACERS_advScheme(iTracer)=saltAdvScheme
69     PTRACERS_diffKh(iTracer)=diffKhS
70     PTRACERS_diffK4(iTracer)=diffK4S
71 jmc 1.11 PTRACERS_diffKr(iTracer)=UNSET_RL
72     DO k=1,Nr
73     PTRACERS_diffKrNr(k,iTracer)=diffKrNrS(k)
74     ENDDO
75 edhill 1.6 PTRACERS_useGMRedi(iTracer)=useGMRedi
76     PTRACERS_useKPP(iTracer)=useKPP
77     PTRACERS_initialFile(iTracer)=' '
78     DO ic = 1,MAX_LEN_FNAM
79     PTRACERS_names(iTracer)(ic:ic) = ' '
80     PTRACERS_long_names(iTracer)(ic:ic) = ' '
81     PTRACERS_units(iTracer)(ic:ic) = ' '
82     ENDDO
83 adcroft 1.1 ENDDO
84 edhill 1.7 PTRACERS_useRecords = .FALSE.
85     PTRACERS_read_mdsio = .TRUE.
86     PTRACERS_read_mnc = .FALSE.
87     PTRACERS_write_mdsio = .TRUE.
88     PTRACERS_write_mnc = .FALSE.
89 adcroft 1.1
90 edhill 1.6 C Open and read the data.ptracers file
91 adcroft 1.1 _BEGIN_MASTER(myThid)
92     WRITE(msgBuf,'(A)') ' PTRACERS_READPARMS: opening data.ptracers'
93     CALL PRINT_MESSAGE(msgBuf, standardMessageUnit,
94     & SQUEEZE_RIGHT , 1)
95     CALL OPEN_COPY_DATA_FILE(
96     I 'data.ptracers', 'PTRACERS_READPARMS',
97     O iUnit,
98     I myThid )
99     READ(UNIT=iUnit,NML=PTRACERS_PARM01)
100     WRITE(msgBuf,'(A)')
101     & ' PTRACERS_READPARMS: finished reading data.ptracers'
102     CALL PRINT_MESSAGE(msgBuf, standardMessageUnit,
103     & SQUEEZE_RIGHT , 1)
104    
105 edhill 1.6 C Close the open data file
106 adcroft 1.1 CLOSE(iUnit)
107     _END_MASTER(myThid)
108    
109 edhill 1.6 C Everyone else must wait for the parameters to be loaded
110 adcroft 1.1 _BARRIER
111    
112 edhill 1.6 C Now set-up any remaining parameters that result from the input
113     C parameters
114 adcroft 1.1
115 edhill 1.6 C If PTRACERS_numInUse was not set in data.ptracers then we can
116     C assume that all PTRACERS fields will be in use
117 adcroft 1.1 IF (PTRACERS_numInUse.LT.0) THEN
118 edhill 1.6 PTRACERS_numInUse=PTRACERS_num
119 adcroft 1.1 ENDIF
120 edhill 1.6 C Check we are not trying to use more tracers than allowed
121 adcroft 1.1 IF (PTRACERS_numInUse.GT.PTRACERS_num) THEN
122 edhill 1.6 WRITE(msgBuf,'(A,I2,A,I2,A)')
123     & ' PTRACERS_READPARMS: You requested ',PTRACERS_numInUse,
124     & ' tracers at run time when only ',PTRACERS_num,
125     & ' were specified at compile time. Naughty! '
126     CALL PRINT_ERROR(msgBuf, 1)
127     STOP 'ABNORMAL END: S/R PTRACERS_READPARMS'
128 adcroft 1.1 ENDIF
129 edhill 1.6 C Check that enough parameters were specified
130 adcroft 1.1 DO iTracer=1,PTRACERS_numInUse
131 edhill 1.6 IF (PTRACERS_advScheme(iTracer).EQ.0) THEN
132     WRITE(msgBuf,'(A,A,I2)')
133     & ' PTRACERS_READPARMS: ',
134     & 'No advect. scheme specified for tracer #',
135     & iTracer
136     CALL PRINT_ERROR(msgBuf, 1)
137     STOP 'ABNORMAL END: S/R PTRACERS_READPARMS'
138     ENDIF
139 adcroft 1.1 ENDDO
140 jmc 1.11 DO iTracer=1,PTRACERS_numInUse
141     PTRACERS_useGMRedi(iTracer) = PTRACERS_useGMRedi(iTracer)
142     & .AND.useGMRedi
143     PTRACERS_useKPP(iTracer) = PTRACERS_useKPP(iTracer)
144     & .AND.useKPP
145     IF ( PTRACERS_diffKr(iTracer).NE.UNSET_RL ) THEN
146     DO k=1,Nr
147     PTRACERS_diffKrNr(k,iTracer)=PTRACERS_diffKr(iTracer)
148     ENDDO
149     ENDIF
150     ENDDO
151 adcroft 1.1
152 edhill 1.6 #ifdef ALLOW_MNC
153     IF (useMNC) THEN
154 edhill 1.7 C Set the default I/O Types
155     IF (PTRACERS_read_mnc) PTRACERS_read_mdsio = .FALSE.
156 edhill 1.10 IF ( (.NOT. outputTypesInclusive)
157 edhill 1.7 & .AND. PTRACERS_write_mnc ) pickup_write_mdsio = .FALSE.
158    
159     C Initialize the MNC variable types for PTRACERS
160 edhill 1.6 CALL PTRACERS_MNC_INIT( myThid )
161     ENDIF
162     #endif /* ALLOW_MNC */
163    
164 jmc 1.12 C-- Print a summary of pTracer parameter values:
165     iUnit = standardMessageUnit
166     WRITE(msgBuf,'(A)') '// ==================================='
167     CALL PRINT_MESSAGE( msgBuf, iUnit, SQUEEZE_RIGHT , 1)
168     WRITE(msgBuf,'(A)') '// PTRACERS parameters '
169     CALL PRINT_MESSAGE( msgBuf, iUnit, SQUEEZE_RIGHT , 1)
170     WRITE(msgBuf,'(A)') '// ==================================='
171     CALL PRINT_MESSAGE( msgBuf, iUnit, SQUEEZE_RIGHT , 1)
172     CALL WRITE_0D_I( PTRACERS_numInUse, INDEX_NONE,
173     & 'PTRACERS_numInUse =',
174     & ' /* number of tracers */')
175     CALL WRITE_0D_R8(PTRACERS_taveFreq, INDEX_NONE,
176     & 'PTRACERS_taveFreq =',
177     & ' /* Frequency^-1 for time-Aver. output (s) */')
178     CALL WRITE_0D_L( PTRACERS_useRecords, INDEX_NONE,
179     & 'PTRACERS_useRecords =', ' /* all tracers in 1 file */')
180     CALL WRITE_0D_L( PTRACERS_write_mdsio, INDEX_NONE,
181     & 'PTRACERS_write_mdsio =', ' /* write mdsio files */')
182     CALL WRITE_0D_L( PTRACERS_write_mnc, INDEX_NONE,
183     & 'PTRACERS_write_mnc =', ' /* write mnc files */')
184    
185     DO iTracer=1,PTRACERS_numInUse
186     WRITE(msgBuf,'(A)') ' -----------------------------------'
187     CALL PRINT_MESSAGE( msgBuf, iUnit, SQUEEZE_RIGHT , 1)
188     WRITE(msgBuf,'(A,I4)') ' tracer number : ',iTracer
189     CALL PRINT_MESSAGE( msgBuf, iUnit, SQUEEZE_RIGHT , 1)
190     CALL WRITE_0D_I( PTRACERS_advScheme(iTracer), INDEX_NONE,
191     & 'PTRACERS_advScheme =', ' /* Advection Scheme */')
192     CALL WRITE_0D_R8( PTRACERS_diffKh(iTracer), INDEX_NONE,
193     & 'PTRACERS_diffKh =', ' /* Laplacian Diffusivity */')
194     CALL WRITE_0D_R8( PTRACERS_diffK4(iTracer), INDEX_NONE,
195     & 'PTRACERS_diffK4 =', ' /* Biharmonic Diffusivity */')
196     CALL WRITE_1D_R8( PTRACERS_diffKrNr(1,iTracer), Nr, INDEX_K,
197     & 'PTRACERS_diffKrNr =', ' /* Vertical Diffusivity */')
198     CALL WRITE_0D_L( PTRACERS_useGMRedi(iTracer), INDEX_NONE,
199     & 'PTRACERS_useGMRedi =', ' /* apply GM-Redi */')
200     CALL WRITE_0D_L( PTRACERS_useKPP(iTracer), INDEX_NONE,
201     & 'PTRACERS_useKPP =', ' /* apply KPP scheme */')
202    
203     ENDDO
204     WRITE(msgBuf,'(A)') ' -----------------------------------'
205     CALL PRINT_MESSAGE( msgBuf, iUnit, SQUEEZE_RIGHT , 1)
206 adcroft 1.1 #endif /* ALLOW_PTRACERS */
207    
208     RETURN
209     END
210 edhill 1.6

  ViewVC Help
Powered by ViewVC 1.1.22