59 equivalence(cval,rval)
69 IF(itp(node).EQ.1)
THEN
71 ELSEIF(typ(node).EQ.
'NUM')
THEN
72 IF(
ibfms(val(n,lun)).EQ.0)
THEN
73 ival(n) =
ipks(val(n,lun),node)
87 IF(itp(node).LT.3)
THEN
91 CALL
pkb(ival(n),ibt(node),ibay,ibit)
97 IF ( ncr.GT.8 .AND. luncpy(lun).NE.0 )
THEN
104 CALL
readlc(luncpy(lun),lstr,tag(node))
105 CALL
pkc(lstr,ncr,ibay,ibit)
108 IF(
ibfms(rval).NE.0)
THEN
113 numchr = min(ncr,len(lstr))
115 CALL
ipkm(lstr(jj:jj),1,255)
117 CALL
pkc(lstr,numchr,ibay,ibit)
126 CALL
pkc(cval,ncr,ibay,ibit)
subroutine pkc(CHR, NCHR, IBAY, IBIT)
This subroutine encodes a character string within a specified number of bits of an integer array...
INTEGER function ipks(VAL, NODE)
THIS FUNCTION PACKS A REAL*8 USER VALUE INTO A BUFR INTEGER BY APPLYING THE PROPER SCALE AND REFERENC...
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 ipkm(CBAY, NBYT, N)
This subroutine encodes an integer value within a specified number of bytes of a character string...
subroutine pkb(NVAL, NBITS, IBAY, IBIT)
This subroutine encodes an integer value within a specified number of bits of an integer array...
This module contains array and variable declarations used to store BUFR messages internally for multi...
subroutine wrtree(LUN)
THIS SUBROUTINE CONVERTS USER NUMBERS INTO SCALED INTEGERS AND PACKS THE USER ARRAY INTO THE SUBSET B...
subroutine readlc(LUNIT, CHR, STR)
This subroutine reads a long character string (greater than 8 bytes) from a data subset.