/[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.6 - (hide annotations) (download)
Fri Sep 3 20:10:47 2004 UTC (19 years, 9 months ago) by edhill
Branch: MAIN
Changes since 1.5: +86 -60 lines
 o first steps towards MNC-ification of PTRACERS
   - compiles and runs with linux_ia32_g77
   - only outputs instantaneous tracer fields (so far!)

1 edhill 1.6 C $Header: /u/gcmpack/MITgcm/pkg/ptracers/ptracers_readparms.F,v 1.5 2004/07/13 16:47:49 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.6
24     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     C iTracer :: loop indices
32     C iUnit :: unit number for I/O
33     C msgBuf :: message buffer
34 adcroft 1.1 INTEGER iTracer
35     INTEGER iUnit
36 edhill 1.6 INTEGER ic
37 adcroft 1.1 CHARACTER*(MAX_LEN_MBUF) msgBuf
38    
39 jmc 1.5 C PTRACERS_taveFreq :: Frequency with which time-averaged PTRACERS
40     C are written to post-processing files.
41     NAMELIST /PTRACERS_PARM01/
42 edhill 1.6 & PTRACERS_taveFreq,
43     & PTRACERS_advScheme,
44     & PTRACERS_diffKh,
45     & PTRACERS_diffK4,
46     & PTRACERS_diffKr,
47     & PTRACERS_useGMRedi,
48     & PTRACERS_useKPP,
49     & PTRACERS_numInUse,
50     & PTRACERS_initialFile,
51     & PTRACERS_useRecords,
52     & PTRACERS_names,
53     & PTRACERS_long_names,
54     & PTRACERS_units,
55     & PTRACERS_mnc_read,
56     & PTRACERS_mnc_write,
57     & PTRACERS_iotypes
58 jmc 1.5
59 edhill 1.6 C This routine has been called by the main model so we set our
60     C internal flag to indicate we are in business
61 adcroft 1.1 PTRACERSisON=.TRUE.
62    
63 edhill 1.6 C Set defaults values for parameters in PTRACERS.h
64 dimitri 1.4 PTRACERS_taveFreq=taveFreq
65 adcroft 1.1 PTRACERS_numInUse=-1
66     DO iTracer=1,PTRACERS_num
67 edhill 1.6 PTRACERS_advScheme(iTracer)=saltAdvScheme
68     PTRACERS_diffKh(iTracer)=diffKhS
69     PTRACERS_diffK4(iTracer)=diffK4S
70     PTRACERS_diffKr(iTracer)=diffKrS
71     PTRACERS_useGMRedi(iTracer)=useGMRedi
72     PTRACERS_useKPP(iTracer)=useKPP
73     PTRACERS_initialFile(iTracer)=' '
74     DO ic = 1,MAX_LEN_FNAM
75     PTRACERS_names(iTracer)(ic:ic) = ' '
76     PTRACERS_long_names(iTracer)(ic:ic) = ' '
77     PTRACERS_units(iTracer)(ic:ic) = ' '
78     ENDDO
79 adcroft 1.1 ENDDO
80 dimitri 1.3 PTRACERS_useRecords=.FALSE.
81 edhill 1.6 PTRACERS_iotypes = -1
82     PTRACERS_mnc_read = .true.
83     PTRACERS_mnc_write = .true.
84 adcroft 1.1
85 edhill 1.6 C Open and read the data.ptracers file
86 adcroft 1.1 _BEGIN_MASTER(myThid)
87     WRITE(msgBuf,'(A)') ' PTRACERS_READPARMS: opening data.ptracers'
88     CALL PRINT_MESSAGE(msgBuf, standardMessageUnit,
89     & SQUEEZE_RIGHT , 1)
90     CALL OPEN_COPY_DATA_FILE(
91     I 'data.ptracers', 'PTRACERS_READPARMS',
92     O iUnit,
93     I myThid )
94     READ(UNIT=iUnit,NML=PTRACERS_PARM01)
95     WRITE(msgBuf,'(A)')
96     & ' PTRACERS_READPARMS: finished reading data.ptracers'
97     CALL PRINT_MESSAGE(msgBuf, standardMessageUnit,
98     & SQUEEZE_RIGHT , 1)
99    
100 edhill 1.6 C Close the open data file
101 adcroft 1.1 CLOSE(iUnit)
102     _END_MASTER(myThid)
103    
104 edhill 1.6 C Everyone else must wait for the parameters to be loaded
105 adcroft 1.1 _BARRIER
106    
107 edhill 1.6 C Now set-up any remaining parameters that result from the input
108     C parameters
109 adcroft 1.1
110 edhill 1.6 C If PTRACERS_numInUse was not set in data.ptracers then we can
111     C assume that all PTRACERS fields will be in use
112 adcroft 1.1 IF (PTRACERS_numInUse.LT.0) THEN
113 edhill 1.6 PTRACERS_numInUse=PTRACERS_num
114 adcroft 1.1 ENDIF
115 edhill 1.6 C Check we are not trying to use more tracers than allowed
116 adcroft 1.1 IF (PTRACERS_numInUse.GT.PTRACERS_num) THEN
117 edhill 1.6 WRITE(msgBuf,'(A,I2,A,I2,A)')
118     & ' PTRACERS_READPARMS: You requested ',PTRACERS_numInUse,
119     & ' tracers at run time when only ',PTRACERS_num,
120     & ' were specified at compile time. Naughty! '
121     CALL PRINT_ERROR(msgBuf, 1)
122     STOP 'ABNORMAL END: S/R PTRACERS_READPARMS'
123 adcroft 1.1 ENDIF
124 edhill 1.6 C Check that enough parameters were specified
125 adcroft 1.1 DO iTracer=1,PTRACERS_numInUse
126 edhill 1.6 IF (PTRACERS_advScheme(iTracer).EQ.0) THEN
127     WRITE(msgBuf,'(A,A,I2)')
128     & ' PTRACERS_READPARMS: ',
129     & 'No advect. scheme specified for tracer #',
130     & iTracer
131     CALL PRINT_ERROR(msgBuf, 1)
132     STOP 'ABNORMAL END: S/R PTRACERS_READPARMS'
133     ENDIF
134 adcroft 1.1 ENDDO
135    
136 edhill 1.6 C Set the default I/O Types
137     IF (PTRACERS_iotypes .EQ. -1) THEN
138     PTRACERS_iotypes = 1
139     ENDIF
140 adcroft 1.1
141 edhill 1.6 #ifdef ALLOW_MNC
142     C Initialize the MNC variable types for PTRACERS
143     IF (useMNC) THEN
144     CALL PTRACERS_MNC_INIT( myThid )
145     ENDIF
146     #endif /* ALLOW_MNC */
147    
148 adcroft 1.1 #endif /* ALLOW_PTRACERS */
149    
150     RETURN
151     END
152 edhill 1.6

  ViewVC Help
Powered by ViewVC 1.1.22