27 SUBROUTINE stntbia ( N, LUN, NUMB, NEMO, CELSQ )
31 CHARACTER*128 BORT_STR
33 CHARACTER*(*) NUMB, NEMO, CELSQ
45 IF(numb(4:6).EQ.
taba(n,lun)(1: 3))
GOTO 900
46 IF(nemo(1:8).EQ.
taba(n,lun)(4:11))
GOTO 901
51 taba(n,lun)( 1: 3) = numb(4:6)
52 taba(n,lun)( 4:11) = nemo(1:8)
53 taba(n,lun)(13:67) = celsq(1:55)
57 IF ( digit( nemo(3:8) ) )
THEN
59 READ ( nemo,
'(2X,2I3)') mtyp, msbt
64 READ ( numb(4:6),
'(I3)')
idna(n,lun,1)
74900
WRITE(bort_str,
'("BUFRLIB: STNTBIA - TABLE A FXY VALUE (",A,") '
75 . //
'HAS ALREADY BEEN DEFINED (DUPLICATE)")') numb
77901
WRITE(bort_str,
'("BUFRLIB: STNTBIA - TABLE A MNEMONIC (",A,") '
78 . //
'HAS ALREADY BEEN DEFINED (DUPLICATE)")') nemo
subroutine bort(STR)
This subroutine calls subroutine errwrt() to log an error message, then calls subroutine bort_exit() ...
This module contains array and variable declarations used to store DX BUFR tables internally for mult...
character *128, dimension(:,:), allocatable taba
Table A entries for each internal I/O stream.
integer, dimension(:), allocatable ntba
Number of Table A entries for each internal I/O stream (up to a maximum of MAXTBA,...
integer, dimension(:,:,:), allocatable idna
Message types (in array element 1) and subtypes (in array element 2) corresponding to taba.
subroutine stntbia(N, LUN, NUMB, NEMO, CELSQ)
THIS SUBROUTINE STORES A NEW ENTRY WITHIN INTERNAL BUFR TABLE A.