60 equivalence(cval,rval)
71 IF(
itp(node).EQ.1)
THEN
73 ELSEIF(
typ(node).EQ.
'NUM')
THEN
74 IF(
ibfms(val(n,lun)).EQ.0)
THEN
75 ival(n) = ipks(val(n,lun),node)
89 IF(
itp(node).LT.3)
THEN
93 CALL pkb8(ival(n),
ibt(node),ibay,ibit)
99 IF ( ncr.GT.8 .AND. luncpy(lun).NE.0 )
THEN
107 CALL pkc(lstr,ncr,ibay,ibit)
110 IF(
ibfms(rval).NE.0)
THEN
115 numchr = min(ncr,len(lstr))
117 CALL ipkm(lstr(jj:jj),1,255)
119 CALL pkc(lstr,numchr,ibay,ibit)
128 CALL pkc(cval,ncr,ibay,ibit)
integer function ibfms(R8VAL)
This function provides a handy way to check whether a real*8 data value returned from a previous call...
subroutine ipkm(CBAY, NBYT, N)
This subroutine encodes an integer value within a specified number of bytes of a character string,...
This module contains array and variable declarations used to store BUFR messages internally for multi...
This module contains array and variable declarations used to store the internal jump/link table.
integer, dimension(:), allocatable itp
Integer type values corresponding to typ:
character *3, dimension(:), allocatable typ
Type indicators corresponding to tag:
integer, dimension(:), allocatable ibt
Bit widths corresponding to tag and typ:
character *10, dimension(:), allocatable tag
Mnemonics in the jump/link table.
subroutine pkb8(nval, nbits, ibay, ibit)
This subroutine encodes an 8-byte integer value within a specified number of bits of an integer array...
subroutine pkc(CHR, NCHR, IBAY, IBIT)
This subroutine encodes a character string within a specified number of bits of an integer array,...
subroutine readlc(LUNIT, CHR, STR)
This subroutine reads a long character string (greater than 8 bytes) from a data subset.
subroutine wrtree(LUN)
THIS SUBROUTINE CONVERTS USER NUMBERS INTO SCALED INTEGERS AND PACKS THE USER ARRAY INTO THE SUBSET B...