35 IF ( tag(node)(1:5) .EQ.
'DPRI ' )
THEN
42 IF ( ntamc .GT. 0 )
THEN
43 nodtam =
lstjpb( node, lun,
'SUB' )
45 IF ( nodtam .EQ. inodtamc(ii) )
THEN
47 IF ( ( inodtco(ii,jj) .GE. inode(lun) ) .AND.
48 . ( inodtco(ii,jj) .LE. isc(inode(lun)) ) .AND.
49 . ( inodtco(ii,jj) .LT. node ) )
THEN
50 IF ( ctco(ii,jj) .EQ.
'236000' )
THEN
52 ELSE IF ( ( ctco(ii,jj) .EQ.
'235000' ) .OR.
53 . ( ctco(ii,jj) .EQ.
'237255' ) )
THEN
61 IF ( .NOT. isbtme )
THEN
64 ELSE IF ( .NOT. linbtm )
THEN
68 IF ( nbtm .GE. mxbtm ) goto 900
75 iszbtm(nbtm) = iszbtm(nbtm) + 1
76 IF (
ibfms(val(n,lun)) .EQ. 0 )
THEN
80 IF ( nbtmse(nbtm) .GE. mxbtmse ) goto 901
81 nbtmse(nbtm) = nbtmse(nbtm) + 1
82 ibtmse(nbtm,nbtmse(nbtm)) = iszbtm(nbtm)
84 ELSE IF ( itp(node) .GT. 1 )
THEN
89 900 CALL
bort(
'BUFRLIB: STRBTM - MXBTM OVERFLOW')
90 901 CALL
bort(
'BUFRLIB: STRBTM - MXBTMSE OVERFLOW')
function lstjpb(NODE, LUN, JBTYP)
THIS FUNCTION SEARCHES BACKWARDS, BEGINNING FROM A GIVEN NODE WITHIN THE JUMP/LINK TABLE...
subroutine strbtm(N, LUN)
THIS SUBROUTINE STORES INTERNAL INFORMATION IN MODULE BITMAPS IF THE INPUT ELEMENT IS PART OF A BITMA...
This module contains array and variable declarations used to store bitmaps internally within a data s...
INTEGER function ibfms(R8VAL)
This function provides a handy way to check whether a real*8 data value returned from a previous call...
This module contains array and variable declarations used to store the internal jump/link table...
subroutine bort(STR)
This subroutine calls subroutine errwrt() to log an error message, then calls subroutine bort_exit() ...