55 SUBROUTINE setvalnb ( LUNIT, TAGPV, NTAGPV, TAGNB, NTAGNB,
62 CHARACTER*(*) TAGPV, TAGNB
73 CALL status (lunit, lun, il, im )
74 IF ( il .LE. 0 )
RETURN
75 IF ( inode(lun) .NE. inv(1,lun) )
RETURN
80 CALL fstag( lun, tagpv, ntagpv, 1, npv, ierft )
81 IF ( ierft .NE. 0 )
RETURN
86 CALL fstag( lun, tagnb, ntagnb, npv, nnb, ierft )
87 IF ( ierft .NE. 0 )
RETURN
subroutine fstag(LUN, UTAG, NUTAG, NIN, NOUT, IRET)
THIS SUBROUTINE FINDS THE (NUTAG)th OCCURRENCE OF MNEMONIC UTAG WITHIN THE CURRENT OVERALL SUBSET DEF...
This module contains array and variable declarations used to store the internal jump/link table.
subroutine setvalnb(LUNIT, TAGPV, NTAGPV, TAGNB, NTAGNB, R8VAL, IRET)
This subroutine can be used to write a data value corresponding to a specific occurrence of a mnemoni...
subroutine status(LUNIT, LUN, IL, IM)
This subroutine checks whether a specified Fortran logical unit number is currently connected to the ...