NCEPLIBS-bufr  11.5.0
 All Data Structures Files Functions Variables Pages
reads3.f
Go to the documentation of this file.
1 C> @file
2 C> @author ATOR @date 2009-03-23
3 
4 C> THIS SUBROUTINE READS THE SECTION 3 DESCRIPTORS FROM THE
5 C> BUFR MESSAGE IN MBAY(1,LUN). IT THEN USES THE BUFR MASTER TABLES
6 C> TO GENERATE THE NECESSARY INFORMATION FOR THESE DESCRIPTORS WITHIN
7 C> THE INTERNAL BUFR TABLE ARRAYS.
8 C>
9 C> PROGRAM HISTORY LOG:
10 C> 2009-03-23 J. ATOR -- ORIGINAL AUTHOR
11 C> 2014-12-10 J. ATOR -- USE MODULES INSTEAD OF COMMON BLOCKS
12 C> 2017-10-13 J. ATOR -- REMOVE FUNCTIONALITY TO CHECK WHETHER NEW
13 C> MASTER TABLES NEED TO BE READ (THIS
14 C> FUNCTIONALITY IS NOW PART OF FUNCTION
15 C> IREADMT)
16 
17 C>
18 C> USAGE: CALL READS3 ( LUN )
19 C> INPUT ARGUMENT LIST:
20 C> LUN - INTEGER: I/O STREAM INDEX INTO INTERNAL MEMORY ARRAYS
21 C>
22 C> REMARKS:
23 C> THIS ROUTINE CALLS: ADN30 BORT DXINIT ERRWRT
24 C> IFXY IGETNTBI IGETTDI IREADMT
25 C> MAKESTAB STNTBIA STSEQ UPDS3
26 C> THIS ROUTINE IS CALLED BY: READERME READMG
27 C> Normally not called by any application
28 C> programs.
29 C>
30  SUBROUTINE reads3 ( LUN )
31 
32  USE moda_sc3bfr
33  USE moda_bitbuf
34  USE moda_dscach
35 
36  COMMON /quiet/ iprt
37 
38  dimension ids3(maxnc)
39  character*6 cds3(maxnc),numb,adn30
40 
41  character*55 cseq
42 
43  character*128 errstr
44 
45  logical incach
46 
47  SAVE irepct
48 
49 C-----------------------------------------------------------------------
50 C-----------------------------------------------------------------------
51 
52 C* Check whether the appropriate BUFR master table information has
53 C* already been read into internal memory for this message.
54 
55  IF ( ireadmt( lun ) .EQ. 1 ) THEN
56 
57 C* NO (i.e. we just had to read in new master table information
58 C* for this message), so reset some corresponding values in
59 C* other parts of the library.
60 
61  CALL dxinit( lun, 0 )
62  itmp = igettdi( 0 )
63  irepct = 0
64  ncnem = 0
65  ENDIF
66 
67 C* Unpack the list of Section 3 descriptors from the message.
68 
69  CALL upds3( mbay(1,lun), maxnc, cds3, ncds3 )
70  DO ii = 1, ncds3
71  ids3(ii) = ifxy( cds3(ii) )
72  ENDDO
73 
74 C* Is the list of Section 3 descriptors already in the cache?
75 
76 C* The cache is a performance-enhancing device which saves
77 C* time when the same descriptor sequences are encountered
78 C* over and over within the calling program. Time is saved
79 C* because the below calls to subroutines STSEQ and MAKESTAB
80 C* are bypassed whenever a list is already in the cache.
81 
82  incach = .false.
83  IF ( ncnem .GT. 0 ) THEN
84  ii = 1
85  DO WHILE ( (.NOT.incach) .AND. (ii.LE.ncnem) )
86  IF ( ncds3 .EQ. ndc(ii) ) THEN
87  jj = 1
88  incach = .true.
89  DO WHILE ( (incach) .AND. (jj.LE.ncds3) )
90  IF ( ids3(jj) .EQ. idcach(ii,jj) ) THEN
91  jj = jj + 1
92  ELSE
93  incach = .false.
94  ENDIF
95  ENDDO
96  IF (incach) THEN
97 
98 C* The list is already in the cache, so store the
99 C* corresponding Table A mnemonic into MODULE SC3BFR
100 C* and return.
101 
102  IF ( iprt .GE. 2 ) THEN
103  CALL errwrt('+++++++++++++++++++++++++++++++++++++++++++++++++')
104  errstr = 'BUFRLIB: READS3 - RE-USED CACHE LIST FOR ' // cnem(ii)
105  CALL errwrt(errstr)
106  CALL errwrt('+++++++++++++++++++++++++++++++++++++++++++++++++')
107  CALL errwrt(' ')
108  ENDIF
109  tamnem(lun) = cnem(ii)
110  RETURN
111  ENDIF
112  ENDIF
113  ii = ii + 1
114  ENDDO
115  ENDIF
116 
117 C* Get the next available index within the internal Table A.
118 
119  n = igetntbi( lun, 'A' )
120 
121 C* Generate a Table A mnemonic and sequence description.
122 
123  WRITE ( tamnem(lun), '(A5,I3.3)') 'MSTTB', n
124  cseq = 'TABLE A MNEMONIC ' // tamnem(lun)
125 
126 C* Store the Table A mnemonic and sequence into the cache.
127 
128  ncnem = ncnem + 1
129  IF ( ncnem .GT. mxcnem ) goto 900
130  cnem(ncnem) = tamnem(lun)
131  ndc(ncnem) = ncds3
132  DO jj = 1, ncds3
133  idcach(ncnem,jj) = ids3(jj)
134  ENDDO
135  IF ( iprt .GE. 2 ) THEN
136  CALL errwrt('+++++++++++++++++++++++++++++++++++++++++++++++++')
137  errstr = 'BUFRLIB: READS3 - STORED CACHE LIST FOR ' //
138  . cnem(ncnem)
139  CALL errwrt(errstr)
140  CALL errwrt('+++++++++++++++++++++++++++++++++++++++++++++++++')
141  CALL errwrt(' ')
142  ENDIF
143 
144 C* Get an FXY value to use with this Table A mnemonic.
145 
146  idn = igettdi( lun )
147  numb = adn30( idn, 6 )
148 
149 C* Store all of the information for this mnemonic within the
150 C* internal Table A.
151 
152  CALL stntbia( n, lun, numb, tamnem(lun), cseq )
153 
154 C* Store all of the information for this sequence within the
155 C* internal Tables B and D.
156 
157  CALL stseq( lun, irepct, idn, tamnem(lun), cseq, ids3, ncds3 )
158 
159 C* Update the jump/link table.
160 
161  CALL makestab
162 
163  RETURN
164 900 CALL bort('BUFRLIB: READS3 - MXCNEM OVERFLOW')
165  END
void stseq(f77int *lun, f77int *irepct, f77int *idn, char nemo[8], char cseq[55], f77int cdesc[], f77int *ncdesc)
C C SUBPROGRAM: STSEQ C PRGMMR: ATOR ORG: NP12 DATE: 2009-03-23 C C ABSTRACT: USING THE BUFR MASTER T...
Definition: stseq.c:64
subroutine reads3(LUN)
THIS SUBROUTINE READS THE SECTION 3 DESCRIPTORS FROM THE BUFR MESSAGE IN MBAY(1,LUN).
Definition: reads3.f:30
subroutine upds3(MBAY, LCDS3, CDS3, NDS3)
This subroutine returns the sequence of data descriptors contained within Section 3 of a BUFR message...
Definition: upds3.f:33
subroutine dxinit(LUN, IOI)
THIS SUBROUTINE INITIALIZES THE INTERNAL ARRAYS (IN MODULE TABABD) HOLDING THE DICTIONARY TABLE...
Definition: dxinit.f:40
function igettdi(IFLAG)
DEPENDING ON THE VALUE OF THE INPUT FLAG, THIS FUNCTION EITHER RETURNS THE NEXT USABLE SCRATCH TABLE ...
Definition: igettdi.f:30
character *(*) function adn30(IDN, L30)
This function converts a descriptor from its bit-wise (integer) representation to its 5 or 6 characte...
Definition: adn30.f:27
function ifxy(ADSC)
THIS FUNCTION RETURNS THE INTEGER CORRESPONDING TO THE BIT-WISE REPRESENTATION OF AN INPUT CHARACTER ...
Definition: ifxy.f:49
subroutine makestab
THIS SUBROUTINE CONSTRUCTS AN INTERNAL JUMP/LINK TABLE WITHIN MODULE TABLES, USING THE INFORMATION WI...
Definition: makestab.f:74
function igetntbi(LUN, CTB)
THIS FUNCTION RETURNS THE NEXT AVAILABLE INDEX FOR STORING AN ENTRY WITHIN INTERNAL BUFR TABLE CTB...
Definition: igetntbi.f:26
subroutine errwrt(STR)
This subroutine allows the user to specify a custom location for the logging of error and diagnostic ...
Definition: errwrt.f:39
INTEGER function ireadmt(LUN)
THIS FUNCTION CHECKS THE MOST RECENT BUFR MESSAGE THAT WAS READ AS INPUT VIA SUBROUTINE READMG...
Definition: ireadmt.F:54
This module contains array and variable declarations for the internal Table A mnemonic cache that is ...
Definition: moda_dscach.F:15
subroutine bort(STR)
This subroutine calls subroutine errwrt() to log an error message, then calls subroutine bort_exit() ...
Definition: bort.f:23
This module contains array and variable declarations used to store BUFR messages internally for multi...
Definition: moda_bitbuf.F:10
subroutine stntbia(N, LUN, NUMB, NEMO, CELSQ)
THIS SUBROUTINE STORES A NEW ENTRY WITHIN INTERNAL BUFR TABLE A.
Definition: stntbia.f:27