' ' Comment ' ' Text.Whitespace 'IDENTIFICATION' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PROGRAM-ID' Keyword.Reserved '.' Punctuation ' ' Text.Whitespace 'OCic' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** This program provides a Textual User Interface (TUI) to the **\n' Comment ' ** process of compiling and (optionally) executing an OpenCOBOL**\n' Comment ' ** program. **\n' Comment ' ** **\n' Comment ' ** This programs execution syntax is as follows: **\n' Comment ' ** **\n' Comment ' ** ocic [ ... ] **\n' Comment ' ** **\n' Comment ' ** Once executed, a display screen will be presented showing **\n' Comment ' ** the compilation options that will be used. The user will **\n' Comment ' ** have the opportunity to change options, specify new ones **\n' Comment ' ** and specify any program execution arguments to be used if **\n' Comment ' ** you select the "Execute" option. When you press the Enter **\n' Comment ' ** key the program will be compiled. **\n' Comment ' ** **\n' Comment ' ** The SCREEN SECTION contains an image of the screen. **\n' Comment ' ** **\n' Comment ' ** The "010-Parse-Args" section in the PROCEDURE DIVISION has **\n' Comment ' ** documentation on switches and their function. **\n' Comment ' *****************************************************************\n' Comment ' ** **\n' Comment ' ** AUTHOR: GARY L. CUTLER **\n' Comment ' ** CutlerGL@gmail.com **\n' Comment ' ** Copyright (C) 2009-2010, Gary L. Cutler, GPL **\n' Comment ' ** **\n' Comment ' ** DATE-WRITTEN: June 14, 2009 **\n' Comment ' ** **\n' Comment ' *****************************************************************\n' Comment " ** Note: Depending on which extended DISPLAY handler you're **\n" Comment ' ** using (PDCurses, Curses, ...), you may need to un- **\n' Comment ' ** comment any source lines tagged with "SCROLL" in cols **\n' Comment ' ** 1-6 in order to have error messages scroll properly **\n' Comment ' ** in the OCic shell window. **\n' Comment ' *****************************************************************\n' Comment ' ** DATE CHANGE DESCRIPTION **\n' Comment ' ** ====== ==================================================== **\n' Comment " ** GC0609 Don't display compiler messages file if compilation **\n" Comment " ** Is successful. Also don't display messages if the **\n" Comment ' ** output file is busy (just put a message on the **\n' Comment ' ** screen, leave the OC screen up & let the user fix **\n' Comment ' ** the problem & resubmit. **\n' Comment " ** GC0709 When 'EXECUTE' is selected, a 'FILE BUSY' error will **\n" Comment ' ** still cause the (old) executable to be launched. **\n' Comment " ** Also, the 'EXTRA SWITCHES' field is being ignored. **\n" Comment ' ** Changed the title bar to lowlighted reverse video & **\n' Comment ' ** the message area to highlighted reverse-video. **\n' Comment ' ** GC0809 Add a SPACE in from of command-line args when **\n' Comment ' ** executing users program. Add a SPACE after the **\n' Comment ' ** -ftraceall switch when building cobc command. **\n' Comment ' ** GC0909 Convert to work on Cygwin/Linux as well as MinGW **\n' Comment ' ** GC0310 Virtualized the key codes for S-F1 thru S-F7 as they **\n' Comment ' ** differ depending upon whether PDCurses or NCurses is **\n' Comment ' ** being used. **\n' Comment ' ** GC0410 Introduced the cross-reference and source listing **\n' Comment ' ** features. Also fixed a bug in @EXTRA switch proces- **\n' Comment ' ** sing where garbage will result if more than the **\n' Comment ' ** @EXTRA switch is specified. **\n' Comment ' *****************************************************************\n' Comment ' ' Comment ' ' Text.Whitespace 'ENVIRONMENT' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'CONFIGURATION' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'REPOSITORY' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FUNCTION' Keyword.Pseudo ' ' Text.Whitespace 'ALL' Keyword.Pseudo ' ' Text.Whitespace 'INTRINSIC' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INPUT-OUTPUT' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FILE-CONTROL' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SELECT' Keyword.Pseudo ' ' Text.Whitespace 'Bat-File' Name.Variable ' ' Text.Whitespace 'ASSIGN' Keyword.Pseudo ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Bat-File-Name' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ORGANIZATION' Keyword.Pseudo ' ' Text.Whitespace 'IS' Keyword.Pseudo ' ' Text.Whitespace 'LINE' Keyword.Pseudo ' ' Text.Whitespace 'SEQUENTIAL' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SELECT' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Output' Name.Variable ' ' Text.Whitespace 'ASSIGN' Keyword.Pseudo ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Output-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ORGANIZATION' Keyword.Pseudo ' ' Text.Whitespace 'IS' Keyword.Pseudo ' ' Text.Whitespace 'LINE' Keyword.Pseudo ' ' Text.Whitespace 'SEQUENTIAL' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SELECT' Keyword.Pseudo ' ' Text.Whitespace 'Source-Code' Name.Variable ' ' Text.Whitespace 'ASSIGN' Keyword.Pseudo ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'File-Name' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ORGANIZATION' Keyword.Pseudo ' ' Text.Whitespace 'IS' Keyword.Pseudo ' ' Text.Whitespace 'LINE' Keyword.Pseudo ' ' Text.Whitespace 'SEQUENTIAL\n ' Keyword.Pseudo ' ' Text.Whitespace 'FILE' Keyword.Reserved ' ' Text.Whitespace 'STATUS' Keyword.Pseudo ' ' Text.Whitespace 'IS' Keyword.Pseudo ' ' Text.Whitespace 'FSM-Status' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DATA' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FILE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FD ' Keyword.Reserved ' ' Text.Whitespace 'Bat-File' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Bat-File-Rec' Name.Variable ' ' Text.Whitespace 'PIC X(2048)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FD ' Keyword.Reserved ' ' Text.Whitespace 'Cobc-Output' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Cobc-Output-Rec' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FD ' Keyword.Reserved ' ' Text.Whitespace 'Source-Code' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Source-Code-Record' Name.Variable ' ' Text.Whitespace 'PIC X(80)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WORKING-STORAGE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'COPY' Keyword.Pseudo ' ' Text.Whitespace 'screenio' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Bat-File-Name' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Cmd' Name.Variable ' ' Text.Whitespace 'PIC X(512)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Cobc-Cmd' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Cobc-Output-File' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Command-Line-Args' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Config-File' Name.Variable ' ' Text.Whitespace 'PIC X(12)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Config-Keys' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CK-S-F1' Name.Variable ' ' Text.Whitespace 'PIC 9(4)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CK-S-F2' Name.Variable ' ' Text.Whitespace 'PIC 9(4)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CK-S-F3' Name.Variable ' ' Text.Whitespace 'PIC 9(4)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CK-S-F4' Name.Variable ' ' Text.Whitespace 'PIC 9(4)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CK-S-F5' Name.Variable ' ' Text.Whitespace 'PIC 9(4)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CK-S-F6' Name.Variable ' ' Text.Whitespace 'PIC 9(4)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CK-S-F7' Name.Variable ' ' Text.Whitespace 'PIC 9(4)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Dir-Char' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Dummy' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Env-TEMP' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'File-Name' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FN-Char' Name.Variable ' ' Text.Whitespace 'OCCURS' Keyword.Pseudo ' ' Text.Whitespace '256 ' Literal.Number.Integer 'TIMES' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'File-Status-Message' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(13)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Status Code: '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FSM-Status' Name.Variable ' ' Text.Whitespace 'PIC 9(2)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(11)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "', Meaning: '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FSM-Msg' Name.Variable ' ' Text.Whitespace 'PIC X(25)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Flags' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Compilation-Succeeded' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Compile-OK' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Compile-OK-Warn' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'W'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Compile-Failed' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Complete' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Complete' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Not-Complete' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-IDENT-DIVISION' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator '1' Literal.Number.Integer 'st-Prog-Complete' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'More-To-1st-Prog' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-LINKAGE-SECTION' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Compile-As-Subpgm' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Compile-As-Mainpgm' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-No-Switch-Changes' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'No-Switch-Changes' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Switch-Changes' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Output-File-Busy' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Output-File-Busy' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Output-File-Avail' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Source-Record-Type' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Source-Rec-Linkage' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'L'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Source-Rec-Ident' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'I'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Source-Rec-IgnoCOB-COLOR-RED' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Switch-Error' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Switch-Is-Bad' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Horizontal-Line' Name.Variable ' ' Text.Whitespace 'PIC X(80)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'I' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'J' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'MS' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'ML' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'OC-Compiled' Name.Variable ' ' Text.Whitespace 'PIC XXXX/XX/XXBXX/XX' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'OS-Type' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'OS-Unknown' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace '0' Literal.Number.Integer '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'OS-Windows' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace '1' Literal.Number.Integer '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'OS-Cygwin' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace '2' Literal.Number.Integer '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'OS-UNIX' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace '3' Literal.Number.Integer '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'OS-Type-Literal' Name.Variable ' ' Text.Whitespace 'PIC X(7)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Output-Message' Name.Variable ' ' Text.Whitespace 'PIC X(80)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Path-Delimiter' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Prog-Folder' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Prog-Extension' Name.Variable ' ' Text.Whitespace 'PIC X(30)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Prog-File-Name' Name.Variable ' ' Text.Whitespace 'PIC X(40)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Prog-Name' Name.Variable ' ' Text.Whitespace 'PIC X(31)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'Selection-Char' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'>'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Switch-Display' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SD-Switch-And-Value' Name.Variable ' ' Text.Whitespace 'PIC X(19)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SD-Description' Name.Variable ' ' Text.Whitespace 'PIC X(60)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Switch-Keyword' Name.Variable ' ' Text.Whitespace 'PIC X(12)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-CONFIG' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@CONFIG'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@C'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-DEBUG' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@DEBUG'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@D'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-DLL' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@DLL'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-EXECUTE' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@EXECUTE'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@E'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-EXTRA' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@EXTRA'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@EX'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-NOTRUNC' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@NOTRUNC'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-TRACE' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@TRACE'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@T'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-SOURCE' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@SOURCE'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@S'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Switch-Is-XREF' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'@XREF'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'@X'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Switch-Keyword-And-Value' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Switch-Value' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SV-1' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(255)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Switch-Value-Alt' Name.Variable ' ' Text.Whitespace 'REDEFINES' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Valid-Config-Filename' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'BS2000'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'COBOL85'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'COBOL2002'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'DEFAULT'" Literal.String.Single ',' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace "'IBM'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'MF'" Literal.String.Single ',' Punctuation ' ' Text.Whitespace "'MVS'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Switches' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'S-ARGS' Name.Variable ' ' Text.Whitespace 'PIC X(75)' Keyword.Type ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'SPACES' Name.Constant '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'S-CfgS' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-Cfg-BS2000' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-Cfg-COBOL85' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-Cfg-COBOL2002' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-Cfg-DEFAULT' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'Selection-Char' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-Cfg-IBM' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-Cfg-MF' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-Cfg-MVS' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'S-EXTRA' Name.Variable ' ' Text.Whitespace 'PIC X(75)' Keyword.Type ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'SPACES' Name.Constant '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'S-Yes-No-Switches' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-DEBUG' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-DLL' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-XREF' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-SOURCE' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-EXECUTE' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-NOTRUNC' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-SUBROUTINE' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'A'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-TRACE' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'S-TRACEALL' Name.Variable ' ' Text.Whitespace 'PIC X(1) ' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Tally' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SCREEN' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> Here is the layout of the OCic screen.\n' Comment ' *>\n' Comment ' *> Note that this program can utilize the traditional PC line-drawing characters,\n' Comment ' *> if they are available.\n' Comment ' *>\n' Comment ' *> If this program is run on Windows, it must run with codepage 437 activated to\n' Comment ' *> display the line-drawing characters. With a native Windows build or a\n' Comment ' *> Windows/MinGW build, one could use the command "chcp 437" to set that codepage\n' Comment ' *> for display within a Windows console window (that should be the default, though).\n' Comment ' *> With a Windows/Cygwin build, set the environment variable CYGWIN to a value of\n' Comment ' *> "codepage:oem" (this cannot be done from within the program though - you will\n' Comment ' *> have to use the "Computer/Advanced System Settings/Environment Variables" (Vista or\n' Comment ' *> Windows 7) function to define the variable. XP Users: use "My Computer/Properties/\n' Comment ' *> Advanced/Environment Variables".\n' Comment ' *>\n' Comment ' *> To use OCic without the line-drawing characters, comment-out the first set of\n' Comment ' *> 78 "LD" items and uncomment the second.\n' Comment ' *>\n' Comment ' *> The following sample screen layout shows how the screen looks with line-drawing\n' Comment ' *> characters disabled.\n' Comment ' *>\n' Comment ' *>===================================================================================\n' Comment ' *> OCic (2010/04/02 11:36) - OpenCOBOL V1.1 Interactive Compilation Windows 01\n' Comment ' *> +-----------------------------------------------------------------------------+ 02\n' Comment ' *> | Program: OCic F-Key: Select Opt | 03\n' Comment ' *> | Folder: E:\\OpenCOBOL\\Samples Enter: Compile | 04\n' Comment ' *> | Filename: OCic.cbl Esc: Quit | 05\n' Comment ' *> +-----------------------------------------------------------------------------+ 06\n' Comment ' *> On/Off Switches: Configuration: 07\n' Comment ' *> +---------------------------------------------------------+-------------------+ 08\n' Comment ' *> | F1 Compile debug lines F8 Produce source listing | S-F1 BS2000 | 09\n' Comment ' *> | F2 Always make DLLs F9 Produce xref listing | S-F2 COBOL85 | 10\n' Comment ' *> | F3 Pgm is a SUBROUTINE | S-F3 COBOL2002 | 11\n' Comment ' *> | F4 Execute if compile OK | S-F4 > Default | 12\n' Comment ' *> | F5 > No COMP/BINARY trunc | S-F5 IBM | 13\n' Comment ' *> | F6 Trace procedures | S-F6 MicroFocus | 14\n' Comment ' *> | F7 Trace proc + stmnts | S-F7 MVS | 15\n' Comment ' *> +---------------------------------------------------------+-------------------+ 16\n' Comment ' *> Additional "cobc" Switches (if any): 17\n' Comment ' *> +-----------------------------------------------------------------------------+ 18\n' Comment ' *> | -O2________________________________________________________________________ | 19\n' Comment ' *> +-----------------------------------------------------------------------------+ 20\n' Comment ' *> Program Execution Arguments (if any): 21\n' Comment ' *> +-----------------------------------------------------------------------------+ 22\n' Comment ' *> | ___________________________________________________________________________ | 23\n' Comment ' *> +-----------------------------------------------------------------------------+ 24\n' Comment ' *> OCic Copyright (C) 2009-2010, Gary L. Cutler, GPL 25\n' Comment ' *>===================================================================================\n' Comment ' *>12345678901234567890123456789012345678901234567890123456789012345678901234567890\n' Comment ' *> 1 2 3 4 5 6 7 8\n' Comment ' *>\n' Comment ' *> USE THESE CHARS FOR LINE-DRAWING IF YOU HAVE ACCESS TO PC-DOS CODEPAGE 437:\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-UL-Corner' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"DA"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-LL-Corner' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"C0"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-UR-Corner' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"BF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-LR-Corner' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"D9"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-Upper-T' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"C2"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-Lower-T' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"C1"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-Horiz-Line' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"C4"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'LD-Vert-Line' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'X' Name.Variable '"B3"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> USE THESE CHARS FOR LINE-DRAWING IF YOU DO NOT HAVE ACCESS TO PC-DOS CODEPAGE 437:\n' Comment ' *>\n' Comment " *> 78 LD-UL-Corner VALUE '+'.\n" Comment " *> 78 LD-LL-Corner VALUE '+'.\n" Comment " *> 78 LD-UR-Corner VALUE '+'.\n" Comment " *> 78 LD-LR-Corner VALUE '+'.\n" Comment " *> 78 LD-Upper-T VALUE '+'.\n" Comment " *> 78 LD-Lower-T VALUE '+'.\n" Comment " *> 78 LD-Horiz-Line VALUE '-'.\n" Comment " *> 78 LD-Vert-Line VALUE '|'.\n" Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Blank-Screen' Name.Variable ' ' Text.Whitespace 'LINE' Keyword.Pseudo ' ' Text.Whitespace '1 ' Literal.Number.Integer 'COLUMN' Keyword.Pseudo ' ' Text.Whitespace '1 ' Literal.Number.Integer 'BLANK' Keyword.Pseudo ' ' Text.Whitespace 'SCREEN' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Switches-Screen' Name.Variable ' ' Text.Whitespace 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-WHITE' Name.Variable ' ' Text.Whitespace 'AUTO' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> GENERAL SCREEN FRAMEWORK\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLUE' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(77)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '03 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '06 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(77)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '08 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(57)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Upper-T' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(19)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '11 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '12 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '13 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '15 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '16 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(57)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '60 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Lower-T' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(19)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '18 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(77)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '19 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '20 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(77)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '22 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(77)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-UR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '23 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-Vert-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '24 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '02 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LL-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(77)' Keyword.Type ' ' Text.Whitespace 'FROM ' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'LD-LR-Corner' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> TOP AND BOTTOM LINES\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLUE' Name.Variable ' ' Text.Whitespace 'BLINK\n ' Keyword.Pseudo ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-WHITE' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '01 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '01 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "' OCic ('" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'PIC X(16)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'OC-Compiled' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "') OpenCOBOL V1.1 06FEB2009 '" Literal.String.Single ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace "'Interactive Compilation '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '25 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '01 ' Literal.Number.Integer 'PIC X(81)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> LABELS\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-CYAN' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'On/Off Switches:'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Configuration:'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '17 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo '\'Additional "cobc" Switches (if any\n' Literal.String.Single ' ' Comment '-' Operator ' ' Text.Whitespace "'):'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '21 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Program Execution Arguments (if an\n" Literal.String.Single ' ' Comment '-' Operator ' ' Text.Whitespace "'y):'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> TOP SECTION BACKGROUND\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-CYAN' Name.Variable ' ' Text.Whitespace 'LOWLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '03 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Program: '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Folder: '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Filename: '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '03 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F-Key: Select Opt'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Enter: Compile '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Esc: Quit '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> TOP SECTION PROGRAM INFO\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-WHITE' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '03 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'PIC X(47)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'Prog-Name' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'PIC X(47)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'Prog-Folder' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '05 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'PIC X(47)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'Prog-File-Name' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> MIDDLE LEFT SECTION F-KEYS\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-WHITE' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F1'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F2'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '11 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F3'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '12 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F4'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '13 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F5'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F6'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '15 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F7'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '32 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F8'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '32 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'F9'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> MIDDLE LEFT SECTION SWITCHES\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-RED' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-DEBUG' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-DLL' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '11 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '12 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-EXECUTE' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '13 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-NOTRUNC' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACE' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '15 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '07 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACEALL' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '35 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-SOURCE' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '35 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-XREF' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> MIDDLE LEFT SECTION BACKGROUND\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-CYAN' Name.Variable ' ' Text.Whitespace 'LOWLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Compile debug lines '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Always make DLLs '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '11 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Pgm is a SUBROUTINE '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '12 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Execute if compile OK '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '13 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'No COMP/BINARY trunc '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Trace procedures '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '15 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Trace proc + stmnts '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '37 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Produce source listing'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '37 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Produce xref listing '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> MIDDLE RIGHT SECTION F-KEYS\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-WHITE' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'S-F1'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'S-F2'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '11 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'S-F3'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '12 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'S-F4'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '13 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'S-F5'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'S-F6'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '15 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '62 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'S-F7'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> MIDDLE RIGHT SECTION SWITCHES\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-RED' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '67 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-BS2000' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '67 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL85' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '11 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '67 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL2002' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '12 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '67 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-DEFAULT' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '13 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '67 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-IBM' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '67 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MF' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '15 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '67 ' Literal.Number.Integer 'PIC X(1)' Keyword.Type ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MVS' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> MIDDLE RIGHT SECTION BACKGROUND\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-CYAN' Name.Variable ' ' Text.Whitespace 'LOWLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '09 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '69 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'BS2000 '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '10 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '69 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'COBOL85 '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '11 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '69 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'COBOL2002 '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '12 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '69 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'Default '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '13 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '69 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'IBM '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '14 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '69 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'MicroFocus'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '15 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '69 ' Literal.Number.Integer 'VALUE ' Keyword.Pseudo "'MVS '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' *>\n' Comment ' *> FREE-FORM OPTIONS FIELDS\n' Comment ' *>\n' Comment ' ' Comment ' ' Text.Whitespace '03 ' Literal.Number.Integer 'BACKGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-BLACK' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FOREGROUND-COLOR' Keyword.Pseudo ' ' Text.Whitespace 'COB-COLOR-WHITE' Name.Variable ' ' Text.Whitespace 'HIGHLIGHT' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '19 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'PIC X(75)' Keyword.Type ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'S-EXTRA' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'LINE' Keyword.Pseudo ' ' Text.Whitespace '23 ' Literal.Number.Integer 'COL' Keyword.Pseudo ' ' Text.Whitespace '04 ' Literal.Number.Integer 'PIC X(75)' Keyword.Type ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'S-ARGS' Name.Variable '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace 'PROCEDURE' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Legend to procedure names: **\n' Comment ' ** **\n' Comment ' ** 00x-xxx All MAIN driver procedures **\n' Comment ' ** 0xx-xxx All GLOBAL UTILITY procedures **\n' Comment ' ** 1xx-xxx All INITIALIZATION procedures **\n' Comment ' ** 2xx-xxx All CORE PROCESSING procedures **\n' Comment ' ** 9xx-xxx All TERMINATION procedures **\n' Comment ' *****************************************************************\n' Comment ' ' Comment ' ' Text.Whitespace 'DECLARATIVES' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '000' Literal.Number.Integer '-' Operator 'File-Error' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'USE' Keyword.Reserved ' ' Text.Whitespace 'AFTER' Keyword.Pseudo ' ' Text.Whitespace 'STANDARD' Keyword.Pseudo ' ' Text.Whitespace 'ERROR' Keyword.Pseudo ' ' Text.Whitespace 'PROCEDURE' Keyword.Reserved ' ' Text.Whitespace 'ON' Keyword.Pseudo ' ' Text.Whitespace 'Source-Code' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '000' Literal.Number.Integer '-' Operator 'Handle-Error' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'COPY' Keyword.Pseudo ' ' Text.Whitespace 'FileStat-Msgs' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'REPLACING' Keyword.Pseudo ' ' Text.Whitespace 'STATUS' Keyword.Pseudo ' ' Text.Whitespace 'BY' Keyword.Pseudo ' ' Text.Whitespace 'FSM-Status' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MSG' Name.Variable ' ' Text.Whitespace 'BY' Keyword.Pseudo ' ' Text.Whitespace 'FSM-Msg' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'FSM-Status' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '35\n ' Literal.Number.Integer 'DISPLAY\n ' Keyword.Reserved '\'File not found: "\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'File-Name' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '\'"\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'DISPLAY\n ' Keyword.Reserved '\'Error accessing file: "\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'File-Name' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '\'"\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END' Keyword.Reserved ' ' Text.Whitespace 'DECLARATIVES' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '000' Literal.Number.Integer '-' Operator 'Main' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '100' Literal.Number.Integer '-' Operator 'Initialization' Name.Variable '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Not-Complete' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE' Name.Builtin '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Complete' Name.Variable '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '200' Literal.Number.Integer '-' Operator 'Let-User-Set-Switches' Name.Variable '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '210' Literal.Number.Integer '-' Operator 'Run-Compiler' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF ' Keyword.Reserved '(' Punctuation '88' Literal.Number.Integer '-' Operator 'Compile-OK' Name.Variable ' ' Text.Whitespace 'OR' Operator.Word ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-OK-Warn' Name.Variable ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'AND ' Operator.Word '(' Punctuation 'S-XREF' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACE' Name.Constant ' ' Text.Whitespace 'OR' Operator.Word ' ' Text.Whitespace 'S-SOURCE' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACE' Name.Constant ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '220' Literal.Number.Integer '-' Operator 'Make-Listing' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'IF ' Keyword.Reserved '(' Punctuation 'S-EXECUTE' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES' Name.Constant ')' Punctuation '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'AND ' Operator.Word '(' Punctuation '88' Literal.Number.Integer '-' Operator 'Output-File-Avail' Name.Variable ')' Punctuation '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '230' Literal.Number.Integer '-' Operator 'Run-Program' Name.Variable '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '009' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '900' Literal.Number.Integer '-' Operator 'Terminate' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace ' * -- Control will NOT return\n' Comment ' /\n' Comment ' ' Comment ' ' Text.Whitespace '010' Literal.Number.Integer '-' Operator 'Parse-Args' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Process a sequence of KEYWORD=VALUE items. These are items **\n' Comment ' ** specified on the command-line to provide the initial **\n' Comment ' ** options shown selected on the screen. When integrating **\n' Comment ' ** OCic into an edirot or framework, include these switches on **\n' Comment ' ** the ocic.exe command the editor/framework executes. Any **\n' Comment ' ** underlined choice is the default value for that switch. **\n' Comment ' ** **\n' Comment ' ** @CONFIG=BS2000|COBOL85|COBOL2002|DEFAULT|IBM|MF|MVS **\n' Comment ' ** ======= **\n' Comment ' ** This switch specifies the default cobc compiler configura- **\n' Comment ' ** tion file to be used **\n' Comment ' ** **\n' Comment ' ** @DEBUG=YES|NO **\n' Comment ' ** == **\n' Comment ' ** This switch specifies whether (YES) or not (NO) debugging **\n' Comment ' ** lines (those with a "D" in column 7) will be compiled. **\n' Comment ' ** **\n' Comment ' ** @DLL=YES|NO **\n' Comment ' ** == **\n' Comment ' ** Use this switch to force ALL compiled programs to be built **\n' Comment ' ** as DLLs ("@DLL=YES"). When main programs are built as DLLs **\n' Comment ' ** they must be executed using the cobcrun utility. When **\n' Comment ' ** "@DLL=NO" is in effect, main programs are generated as **\n' Comment ' ** actual "exe" files and only subprograms will be generated **\n' Comment ' ** as DLLs. **\n' Comment ' ** **\n' Comment ' ** @EXECUTE=YES|NO **\n' Comment ' ** == **\n' Comment ' ** This switch specifies whether ("@EXECUTE=YES") or not **\n' Comment ' ** ("@EXECUTE=NO") the program will be executed after it is **\n' Comment ' ** successfully compiled. **\n' Comment ' ** **\n' Comment ' ** @EXTRA=extra cobc argument(s) **\n' Comment ' ** **\n' Comment ' ** This switch allows you to specify additional cobc arguments **\n' Comment " ** that aren't managed by the other OC switches. If used, **\n" Comment ' ** this must be the last switch specified on the command line, **\n' Comment ' ** as everything that follows the "=" will be placed on the **\n' Comment ' ** cobc command generated by OC. **\n' Comment ' ** **\n' Comment ' ** @NOTRUNC=YES|NO **\n' Comment ' ** === **\n' Comment ' ** This switch specifies whether (YES) or not (NO) the sup- **\n' Comment ' ** pression of binary field truncation will occur. If a PIC **\n' Comment ' ** 99 COMP field (one byte of storage), for example, is given **\n' Comment ' ** the value 123, it may have its value truncated to 23 when **\n' Comment ' ** DISPLAYed. Regardless of the NOTRUNC setting, internally **\n' Comment ' ** the full precision of the field (allowing a maximum value **\n' Comment ' ** of 255) will be preserved. Even though truncation - if it **\n' Comment ' ** does occur - would appear to have a minimal disruption on **\n' Comment ' ** program operation, it has a significant effect on program **\n' Comment ' ** run-time speed. **\n' Comment ' ** **\n' Comment ' ** @TRACE=YES|NO|ALL **\n' Comment ' ** == **\n' Comment ' ** This switch controls whether or not code will be added to **\n' Comment ' ** the object program to produce execution-time logic traces. **\n' Comment ' ** A specification of "@TRACE=NO" means no such code will be **\n' Comment ' ** produced. By specifying "@TRACE=YES", code will be genera- **\n' Comment ' ** ted to display procedure names as they are entered. A **\n' Comment ' ** "@TRACE=ALL" specification will generate not only procedure **\n' Comment ' ** traces (as "@TRACE=YES" would) but also statement-level **\n' Comment ' ** traces too! All trace output is written to STDERR, so **\n' Comment ' ** adding a "2>file" to the execution of the program will pipe **\n' Comment ' ** the trace output to a file. You may find it valuable to **\n' Comment ' ** add your own DISPLAY statements to the debugging output via **\n' Comment ' ** "DISPLAY xx UPON SYSERR" The SYSERR device corresponds to **\n' Comment ' ** the Windows or UNIX STDERR device and will therefore honor **\n' Comment ' ** any "2>file" placed at the end of your program\'s execution. **\n' Comment ' ** Add a "D" in column 7 and you can control the generation or **\n' Comment ' ** ignoring of these DISPLAY statements via the "@DEBUG" **\n' Comment ' ** switch. **\n' Comment ' ** **\n' Comment 'GC0410** @SOURCE=YES|NO **\n' Comment 'GC0410** == **\n' Comment 'GC0410** Use this switch to produce a source listing of the program, **\n' Comment 'GC0410** PROVIDED it compiles without errors. **\n' Comment ' ** **\n' Comment 'GC0410** @XREF=YES|NO **\n' Comment 'GC0410** == **\n' Comment 'GC0410** Use this switch to produce a cross-reference listing of the **\n' Comment 'GC0410** program, PROVIDED it compiles without errors. **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '011' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '012' Literal.Number.Integer '-' Operator 'Extract-Kwd-And-Value' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '<' Operator ' ' Text.Whitespace 'LENGTH' Keyword.Pseudo '(' Punctuation 'Command-Line-Args' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'J' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'UNSTRING' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'BY' Keyword.Pseudo ' ' Text.Whitespace 'ALL SPACES\n ' Name.Constant ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword-And-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-UNSTRING\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Switch-Keyword-And-Value' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'UNSTRING' Keyword.Reserved ' ' Text.Whitespace 'Switch-Keyword-And-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'BY ' Keyword.Pseudo "'='" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable ',' Punctuation ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-UNSTRING\n ' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '030' Literal.Number.Integer '-' Operator 'Process-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '019' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Since this program uses the SCREEN SECTION, it cannot do **\n' Comment ' ** conventional console DISPLAY operations. This routine **\n' Comment ' ** (which, I admit, is like using an H-bomb to hunt rabbits) **\n' Comment ' ** will submit an "ECHO" command to the system to simulate a **\n' Comment ' ** DISPLAY. **\n' Comment ' *****************************************************************\n' Comment ' ' Comment ' ' Text.Whitespace '021' Literal.Number.Integer '-' Operator 'Build-And-Issue-Command' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-DISPLAY\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '029' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '030' Literal.Number.Integer '-' Operator 'Process-Keyword' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Process a single KEYWORD=VALUE item. **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '031' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Keyword' Name.Variable ')' Punctuation ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '032' Literal.Number.Integer '-' Operator 'Process' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EVALUATE' Keyword.Reserved ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-EXTRA' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'J' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'UNSTRING' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'BY ' Keyword.Pseudo "'='" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Dummy' Name.Variable ',' Punctuation ' ' Text.Whitespace 'S-EXTRA' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-UNSTRING\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'LENGTH' Keyword.Pseudo '(' Punctuation 'Command-Line-Args' Name.Variable ')' Punctuation ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-CONFIG' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'CONFIG'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EVALUATE' Keyword.Reserved ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'BS2000'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-BS2000' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'COBOL85'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL85' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'COBOL2002'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL2002' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'DEFAULT'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-DEFAULT' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'IBM'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-IBM' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'MF'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MF' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'MVS'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MVS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OTHER\n ' Keyword.Pseudo ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'An invalid /CONFIG switch value '" Literal.String.Single ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace "'was specified on the command line '" Literal.String.Single ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace "'- ignored'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-EVALUATE\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-DEBUG' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'DEBUG'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '040' Literal.Number.Integer '-' Operator 'Process-Yes-No-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-DEBUG' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-DLL' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'DLL'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '040' Literal.Number.Integer '-' Operator 'Process-Yes-No-Value' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-DLL' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-EXECUTE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'EXECUTE'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '040' Literal.Number.Integer '-' Operator 'Process-Yes-No-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-EXECUTE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-NOTRUNC' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'NOTRUNC'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '040' Literal.Number.Integer '-' Operator 'Process-Yes-No-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-NOTRUNC' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-SOURCE' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'SOURCE'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '050' Literal.Number.Integer '-' Operator 'Process-Yes-No-All' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-SOURCE' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-TRACE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'TRACE'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '050' Literal.Number.Integer '-' Operator 'Process-Yes-No-All' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Is-XREF' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'XREF'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '050' Literal.Number.Integer '-' Operator 'Process-Yes-No-All' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Good' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-XREF' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OTHER\n ' Keyword.Pseudo ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved '\'"\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Switch-Keyword' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '\'" is not a valid switch \'' Literal.String.Single ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace "'- ignored'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE\n ' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Bad' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'END-EVALUATE\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '039' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '040' Literal.Number.Integer '-' Operator 'Process-Yes-No-Value' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Process a switch value of YES or NO **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '042' Literal.Number.Integer '-' Operator 'Process' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EVALUATE' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'Y'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'YES'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo "'N'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'NO'" Literal.String.Single ' ' Text.Whitespace 'To' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OTHER\n ' Keyword.Pseudo ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved '\'*ERROR: "\'' Literal.String.Single ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Switch-Value' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '\'" is not a valid value for the "\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Switch-Keyword' Name.Variable ')' Punctuation ' ' Text.Whitespace '\'" switch\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Is-Bad' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'END-EVALUATE\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '049' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '050' Literal.Number.Integer '-' Operator 'Process-Yes-No-All' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Process a switch value of YES, NO or ALL **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '052' Literal.Number.Integer '-' Operator 'Process' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'A'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'ALL'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '040' Literal.Number.Integer '-' Operator 'Process-Yes-No-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '059' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '060' Literal.Number.Integer '-' Operator 'Process-Yes-No-Auto' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Process a switch value of YES, NO or AUTO **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '061' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'SV-1' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'A'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '070' Literal.Number.Integer '-' Operator 'Find-LINKAGE-SECTION' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-As-Subpgm' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'Y'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'N'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '040' Literal.Number.Integer '-' Operator 'Process-Yes-No-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '070' Literal.Number.Integer '-' Operator 'Find-LINKAGE-SECTION' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Determine if the program being compiled is a MAIN program **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '071' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'OPEN' Keyword.Reserved ' ' Text.Whitespace 'INPUT' Keyword.Pseudo ' ' Text.Whitespace 'Source-Code' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-As-Mainpgm' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'More-To-1st-Prog' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator '1' Literal.Number.Integer 'st-Prog-Complete' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'READ' Keyword.Reserved ' ' Text.Whitespace 'Source-Code' Name.Variable ' ' Text.Whitespace 'AT' Keyword.Pseudo ' ' Text.Whitespace 'END\n ' Keyword.Reserved ' ' Text.Whitespace 'CLOSE' Keyword.Reserved ' ' Text.Whitespace 'Source-Code' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved ' ' Text.Whitespace 'SECTION\n ' Keyword.Reserved ' ' Text.Whitespace 'END-READ\n ' Keyword.Reserved ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'CHECKSOURCE'" Literal.String.Single ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'Source-Code-Record' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'F-Source-Record-Type' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-CALL\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Source-Rec-Ident' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator '1' Literal.Number.Integer 'st-Prog-Complete' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '072' Literal.Number.Integer '-' Operator 'Process-Source' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Source-Rec-IgnoCOB-COLOR-RED' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Source-Rec-Linkage' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'OR' Operator.Word ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Source-Rec-Ident' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'READ' Keyword.Reserved ' ' Text.Whitespace 'Source-Code' Name.Variable ' ' Text.Whitespace 'AT' Keyword.Pseudo ' ' Text.Whitespace 'END\n ' Keyword.Reserved ' ' Text.Whitespace 'CLOSE' Keyword.Reserved ' ' Text.Whitespace 'Source-Code' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved ' ' Text.Whitespace 'SECTION\n ' Keyword.Reserved ' ' Text.Whitespace 'END-READ\n ' Keyword.Reserved ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'CHECKSOURCE'" Literal.String.Single ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'Source-Code-Record' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'F-Source-Record-Type' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-CALL\n ' Keyword.Reserved ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved ' ' Text.Whitespace 'CLOSE' Keyword.Reserved ' ' Text.Whitespace 'Source-Code' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Source-Rec-Linkage' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-As-Subpgm' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '079' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '100' Literal.Number.Integer '-' Operator 'Initialization' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Perform all program-wide initialization operations **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '101' Literal.Number.Integer '-' Operator 'Determine-OS-Type' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'GETOSTYPE'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'RETURN-CODE' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'OS-Type' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'EVALUATE' Keyword.Reserved ' ' Text.Whitespace 'TRUE' Name.Builtin '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OS-Unknown' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'\\'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'Unknown'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'OS-Type-Literal' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F11' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F1' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F12' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F2' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F13' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F3' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F14' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F4' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F15' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F5' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F16' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F6' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F17' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F7' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OS-Windows' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'\\'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'Windows'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'OS-Type-Literal' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F13' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F1' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F14' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F2' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F15' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F3' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F16' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F4' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F17' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F5' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F18' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F6' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F19' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F7' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OS-Cygwin' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'/'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'Cygwin'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'OS-Type-Literal' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F11' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F1' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F12' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F2' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F13' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F3' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F14' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F4' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F15' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F5' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F16' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F6' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F17' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F7' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OS-UNIX' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'/'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'UNIX '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'OS-Type-Literal' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F11' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F1' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F12' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F2' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F13' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F3' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F14' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F4' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F15' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F5' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F16' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F6' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'COB-SCR-F17' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F7' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-EVALUATE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '102' Literal.Number.Integer '-' Operator 'Set-Environment-Vars' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace 'ENVIRONMENT ' Keyword.Reserved "'COB_SCREEN_EXCEPTIONS'" Literal.String.Single ' ' Text.Whitespace 'TO ' Keyword.Pseudo "'Y'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace 'ENVIRONMENT ' Keyword.Reserved "'COB_SCREEN_ESC'" Literal.String.Single ' ' Text.Whitespace 'TO ' Keyword.Pseudo "'Y'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '103' Literal.Number.Integer '-' Operator 'Generate-Cobc-Output-Fn' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ACCEPT' Keyword.Reserved ' ' Text.Whitespace 'Env-TEMP' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'ENVIRONMENT ' Keyword.Reserved '"TEMP"' Literal.String.Double '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-ACCEPT\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Output-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Env-TEMP' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace "'OC-Messages.TXT'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE\n ' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Output-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '104' Literal.Number.Integer '-' Operator 'Generate-Banner-Line-Info' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'WHEN-COMPILED ' Name.Function '(' Punctuation '1' Literal.Number.Integer ':' Punctuation '12' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'OC-Compiled' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INSPECT' Keyword.Reserved ' ' Text.Whitespace 'OC-Compiled' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'REPLACING' Keyword.Pseudo ' ' Text.Whitespace 'ALL ' Keyword.Pseudo "'/'" Literal.String.Single ' ' Text.Whitespace 'BY ' Keyword.Pseudo "':'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'AFTER' Keyword.Pseudo ' ' Text.Whitespace 'INITIAL' Keyword.Pseudo ' ' Text.Whitespace 'SPACE\n ' Name.Constant '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '105' Literal.Number.Integer '-' Operator 'Establish-Switch-Settings' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ACCEPT' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'COMMAND-LINE\n ' Keyword.Pseudo ' ' Text.Whitespace 'END-ACCEPT\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Command-Line-Args' Name.Variable ',' Punctuation ' ' Text.Whitespace 'Leading' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '0 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Tally' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'INSPECT' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable ' ' Text.Whitespace 'TALLYING' Keyword.Pseudo ' ' Text.Whitespace 'Tally' Name.Variable ' ' Text.Whitespace 'FOR' Keyword.Pseudo ' ' Text.Whitespace 'ALL ' Keyword.Pseudo "'@'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Tally' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '0\n ' Literal.Number.Integer 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'File-Name' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'UNSTRING' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'BY ' Keyword.Pseudo "'@'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'File-Name' Name.Variable ',' Punctuation ' ' Text.Whitespace 'Dummy' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-UNSTRING\n ' Keyword.Reserved ' ' Text.Whitespace 'INSPECT' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'REPLACING' Keyword.Pseudo ' ' Text.Whitespace 'FIRST ' Keyword.Pseudo "'@'" Literal.String.Single ' ' Text.Whitespace 'BY' Keyword.Pseudo ' ' Text.Whitespace 'LOW-VALUES\n ' Name.Constant ' ' Text.Whitespace 'UNSTRING' Keyword.Reserved ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'BY' Keyword.Pseudo ' ' Text.Whitespace 'LOW-VALUES\n ' Name.Constant ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Dummy' Name.Variable ',' Punctuation ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-UNSTRING\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'@'" Literal.String.Single ' ' Text.Whitespace 'Cmd' Name.Variable ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE\n ' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Command-Line-Args' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'File-Name' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'DISPLAY\n ' Keyword.Reserved "'No program filename was specified'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '900' Literal.Number.Integer '-' Operator 'Terminate' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '010' Literal.Number.Integer '-' Operator 'Parse-Args' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'A'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'S'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Keyword' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'A'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Switch-Value' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '070' Literal.Number.Integer '-' Operator 'Find-LINKAGE-SECTION' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-As-Subpgm' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'Y'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'N'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'INSPECT' Keyword.Reserved ' ' Text.Whitespace 'S-Yes-No-Switches' Name.Variable ' ' Text.Whitespace 'REPLACING' Keyword.Pseudo ' ' Text.Whitespace 'ALL ' Keyword.Pseudo "'Y'" Literal.String.Single ' ' Text.Whitespace 'BY' Keyword.Pseudo ' ' Text.Whitespace 'Selection-Char' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INSPECT' Keyword.Reserved ' ' Text.Whitespace 'S-Yes-No-Switches' Name.Variable ' ' Text.Whitespace 'REPLACING' Keyword.Pseudo ' ' Text.Whitespace 'ALL ' Keyword.Pseudo "'N'" Literal.String.Single ' ' Text.Whitespace 'BY ' Keyword.Pseudo "' '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '106' Literal.Number.Integer '-' Operator 'Determine-Folder-Path' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'Move' Keyword.Reserved ' ' Text.Whitespace '256 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'OS-Cygwin' Name.Variable ' ' Text.Whitespace 'AND' Operator.Word ' ' Text.Whitespace 'File-Name' Name.Variable ' ' Text.Whitespace '(' Punctuation '2' Literal.Number.Integer ':' Punctuation '1' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "':'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'\\'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '0 ' Literal.Number.Integer 'OR' Operator.Word ' ' Text.Whitespace 'FN-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SUBTRACT' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '0\n ' Literal.Number.Integer 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Prog-Folder' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'File-Name' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Prog-File-Name' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'*'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'FN-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'UNSTRING' Keyword.Reserved ' ' Text.Whitespace 'File-Name' Name.Variable ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'BY ' Keyword.Pseudo "'*'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Prog-Folder' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'Prog-File-Name' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-UNSTRING\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Dir-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'FN-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'UNSTRING' Keyword.Reserved ' ' Text.Whitespace 'Prog-File-Name' Name.Variable ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'BY ' Keyword.Pseudo "'.'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Prog-Name' Name.Variable ',' Punctuation ' ' Text.Whitespace 'Prog-Extension' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-UNSTRING\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Prog-Folder' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'ACCEPT' Keyword.Reserved ' ' Text.Whitespace 'Prog-Folder' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'ENVIRONMENT ' Keyword.Reserved "'CD'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-ACCEPT' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved '"CBL_CHANGE_DIR"' Literal.String.Double '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Prog-Folder' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-CALL\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'OS-Cygwin' Name.Variable ' ' Text.Whitespace 'AND' Operator.Word ' ' Text.Whitespace 'File-Name' Name.Variable ' ' Text.Whitespace '(' Punctuation '2' Literal.Number.Integer ':' Punctuation '1' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "':'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'/'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '107' Literal.Number.Integer '-' Operator 'Other' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'ALL' Keyword.Pseudo ' ' Text.Whitespace 'LD-Horiz-Line' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Horizontal-Line' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'CONCATENATE' Name.Function '(' Punctuation "' OCic for '" Literal.String.Single ',' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'OS-Type-Literal' Name.Variable ',' Punctuation 'Trailing' Keyword.Pseudo ')' Punctuation ',' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace "' Copyright (C) 2009-2010, Gary L. Cutler,'" Literal.String.Single ',' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace "' GPL'" Literal.String.Single ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '109' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '200' Literal.Number.Integer '-' Operator 'Let-User-Set-Switches' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Show the user the current switch settings and allow them to **\n' Comment ' ** be changed. **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '201' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Switch-Changes' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '202' Literal.Number.Integer '-' Operator 'Show-And-Change-Switches' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'No-Switch-Changes' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ACCEPT\n ' Keyword.Reserved ' ' Text.Whitespace 'Switches-Screen' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-ACCEPT\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'COB-CRT-STATUS' Name.Variable ' ' Text.Whitespace '>' Operator ' ' Text.Whitespace '0\n ' Literal.Number.Integer 'EVALUATE' Keyword.Reserved ' ' Text.Whitespace 'COB-CRT-STATUS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F1' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-DEBUG' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-DEBUG' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-DEBUG' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F2' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-DLL' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-DLL' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-DLL' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F3' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-EXECUTE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F4' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF ' Keyword.Reserved ' ' Text.Whitespace 'S-EXECUTE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'AND' Operator.Word ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-EXECUTE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-EXECUTE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F5' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF ' Keyword.Reserved ' ' Text.Whitespace 'S-NOTRUNC' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-NOTRUNC' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-NOTRUNC' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F6' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF ' Keyword.Reserved ' ' Text.Whitespace 'S-TRACE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACEALL' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F7' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF ' Keyword.Reserved ' ' Text.Whitespace 'S-TRACEALL' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACEALL' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-TRACEALL' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F8' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-SOURCE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE' Name.Constant '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-SOURCE' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-SOURCE' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-F9' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-XREF' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE' Name.Constant '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-XREF' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-XREF' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'COB-SCR-ESC' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '900' Literal.Number.Integer '-' Operator 'Terminate' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F1' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-BS2000' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F2' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL85' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F3' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL2002' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F4' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-DEFAULT' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F5' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-IBM' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F6' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MF' Name.Variable '\n' Text.Whitespace 'GC0310' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CK-S-F7' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES ' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-CfgS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'Selection-Char' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MVS' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OTHER\n ' Keyword.Pseudo ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'An unsupported key was pressed'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-EVALUATE\n ' Keyword.Reserved ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'No-Switch-Changes' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '209' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '210' Literal.Number.Integer '-' Operator 'Run-Compiler' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment " ** Run the compiler using the switch settings we've prepared. **\n" Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '211' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'Switches-Screen' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EVALUATE' Keyword.Reserved ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-BS2000' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'bs2000'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Config-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL85' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'cobol85'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Config-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-COBOL2002' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'cobol2002'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Config-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-IBM' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'ibm'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Config-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MF' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'mf'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Config-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo ' ' Text.Whitespace 'S-Cfg-MVS' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'mvs'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Config-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'OTHER\n ' Keyword.Pseudo ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "'default'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Config-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-EVALUATE\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '212' Literal.Number.Integer '-' Operator 'Build-Compile-Command' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'cobc -std='" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Config-File' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'-m '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'-x '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-DEBUG' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'-fdebugging-line '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-NOTRUNC' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'-fnotrunc '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-TRACEALL' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'-ftraceall '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-TRACE' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'-ftrace '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n' Keyword.Reserved '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-EXTRA' Name.Variable ' ' Text.Whitespace '>' Operator ' ' Text.Whitespace 'SPACES' Name.Constant '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "' '" Literal.String.Single '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'S-Extra' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0709' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Prog-File-Name' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '213' Literal.Number.Integer '-' Operator 'Run-Compiler' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' Compiling...'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'Switches-Screen' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Output-File-Avail' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Cobc-Cmd' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace "' 2>'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Cobc-Output-File' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE\n ' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'SYSTEM'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Cmd' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'RETURN-CODE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '0\n' Literal.Number.Integer 'GC0909' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-OK' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE' Name.Builtin '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-Failed' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE' Name.Builtin '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-OK' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'OPEN' Keyword.Reserved ' ' Text.Whitespace 'INPUT' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Output' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'READ' Keyword.Reserved ' ' Text.Whitespace 'Cobc-Output' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'AT' Keyword.Pseudo ' ' Text.Whitespace 'END' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'CONTINUE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'NOT' Operator.Word ' ' Text.Whitespace 'AT' Keyword.Pseudo ' ' Text.Whitespace 'END' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-OK-Warn' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE' Name.Builtin '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-READ' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'CLOSE' Keyword.Reserved ' ' Text.Whitespace 'Cobc-Output' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-OK' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' Compilation Was Successful'" Literal.String.Single ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'Switches-Screen' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'C$SLEEP'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace '2\n' Literal.Number.Integer 'GC0909' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Complete' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'Blank-Screen' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-OK-Warn' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY ' Keyword.Reserved "' Compilation was successful, but '" Literal.String.Single ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace "'warnings were generated:'" Literal.String.Single '\n' Text.Whitespace 'SCROLL* AT LINE 24 COLUMN 1\n' Comment 'SCROLL* WITH SCROLL UP 1 LINE\n' Comment 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY ' Keyword.Reserved "'Compilation Failed:'" Literal.String.Single '\n' Text.Whitespace 'SCROLL* AT LINE 24 COLUMN 1\n' Comment 'SCROLL* WITH SCROLL UP 1 LINE\n' Comment 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-Failed' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE' Name.Builtin '\n' Text.Whitespace 'GC0609' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Complete' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE' Name.Builtin '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY ' Keyword.Reserved "' '" Literal.String.Single '\n' Text.Whitespace 'SCROLL* AT LINE 24 COLUMN 1\n' Comment 'SCROLL* WITH SCROLL UP 1 LINE\n' Comment 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'OPEN' Keyword.Reserved ' ' Text.Whitespace 'INPUT' Keyword.Pseudo ' ' Text.Whitespace 'Cobc-Output' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'FOREVER' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'READ' Keyword.Reserved ' ' Text.Whitespace 'Cobc-Output' Name.Variable ' ' Text.Whitespace 'AT' Keyword.Pseudo ' ' Text.Whitespace 'END' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-READ' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Cobc-Output-Rec' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'SCROLL* AT LINE 24 COLUMN 1\n' Comment 'SCROLL* WITH SCROLL UP 1 LINE\n' Comment 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-PERFORM' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'CLOSE' Keyword.Reserved ' ' Text.Whitespace 'Cobc-Output' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY ' Keyword.Reserved "' '" Literal.String.Single '\n' Text.Whitespace 'SCROLL* AT LINE 24 COLUMN 1\n' Comment 'SCROLL* WITH SCROLL UP 2 LINES\n' Comment 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY ' Keyword.Reserved "'Press ENTER to close:'" Literal.String.Single '\n' Text.Whitespace 'SCROLL* AT LINE 24 COLUMN 1\n' Comment 'SCROLL* WITH SCROLL UP 1 LINE\n' Comment 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'ACCEPT' Keyword.Reserved ' ' Text.Whitespace 'Dummy' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'CONSOLE' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-ACCEPT' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'Blank-Screen' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '219' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Compile-Failed' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '900' Literal.Number.Integer '-' Operator 'Terminate' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment 'GC0410' Comment ' ' Text.Whitespace '220' Literal.Number.Integer '-' Operator 'Make-Listing' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace 'GC0410*****************************************************************\n' Comment 'GC0410** Generate a source and/or xref listing using XREF **\n' Comment 'GC0410*****************************************************************\n' Comment 'GC0410' Comment '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '221' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' Generating cross-reference listing...'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'Switches-Screen' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved '"CBL_DELETE_FILE"' Literal.String.Double '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'CONCATENATE' Name.Function '(' Punctuation 'TRIM' Name.Function '(' Punctuation 'Prog-Name' Name.Variable ',' Punctuation 'Trailing' Keyword.Pseudo ')' Punctuation ',' Punctuation '".lst"' Literal.String.Double ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '0 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'RETURN-CODE' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '213' Literal.Number.Integer '-' Operator 'Run-OCXref' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'LISTING'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'S-SOURCE' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'S-XREF' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'File-Name' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'ON' Keyword.Pseudo ' ' Text.Whitespace 'EXCEPTION' Keyword.Pseudo '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' LISTING module is not available'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'RETURN-CODE' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'RETURN-CODE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '0\n' Literal.Number.Integer 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' Listing generated'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'OS-Windows' Name.Variable ' ' Text.Whitespace 'OR' Operator.Word ' ' Text.Whitespace 'OS-Cygwin' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace "'cmd /c '" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Prog-Name' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace "'.lst'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'SYSTEM'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Cmd' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Output-Message' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACES' Name.Constant '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'MOVE ' Keyword.Reserved "' Listing generation failed'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Output-Message' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'Switches-Screen' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'C$SLEEP'" Literal.String.Single '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace '2\n' Literal.Number.Integer 'GC0410' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '230' Literal.Number.Integer '-' Operator 'Run-Program' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Run the compiled program **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '232' Literal.Number.Integer '-' Operator 'Build-Command' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'OR' Operator.Word ' ' Text.Whitespace 'S-DLL' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'cobcrun '" Literal.String.Single ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE\n ' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Prog-Folder' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES' Name.Constant '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'OS-Cygwin' Name.Variable ' ' Text.Whitespace 'AND' Operator.Word ' ' Text.Whitespace 'Prog-Folder' Name.Variable ' ' Text.Whitespace '(' Punctuation '2' Literal.Number.Integer ':' Punctuation '1' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "':'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'/cygdrive/'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved ' ' Text.Whitespace 'LOWER-CASE' Name.Function '(' Punctuation 'Prog-Folder' Name.Variable ' ' Text.Whitespace '(' Punctuation '1' Literal.Number.Integer ':' Punctuation '1' Literal.Number.Integer ')' Punctuation ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'VARYING' Keyword.Pseudo ' ' Text.Whitespace 'J' Name.Variable ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace '3 ' Literal.Number.Integer 'BY' Keyword.Pseudo ' ' Text.Whitespace '1\n' Literal.Number.Integer 'GC0909' Comment ' ' Text.Whitespace 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace 'J' Name.Variable ' ' Text.Whitespace '>' Operator ' ' Text.Whitespace 'LENGTH' Keyword.Pseudo '(' Punctuation 'TRIM' Name.Function '(' Punctuation 'Prog-Folder' Name.Variable ')' Punctuation ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Prog-Folder' Name.Variable ' ' Text.Whitespace '(' Punctuation 'J' Name.Variable ':' Punctuation '1' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'\\'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'/'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved ' ' Text.Whitespace 'Prog-Folder' Name.Variable ' ' Text.Whitespace '(' Punctuation 'J' Name.Variable ':' Punctuation '1' Literal.Number.Integer ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-PERFORM' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved '\'"\'' Literal.String.Single ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Prog-Folder' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved ' ' Text.Whitespace 'Dir-Char' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'ELSE' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'OS-Cygwin' Name.Variable ' ' Text.Whitespace 'OR' Operator.Word ' ' Text.Whitespace 'OS-UNIX' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'./'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING' Keyword.Reserved ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Prog-Name' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-STRING' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-SUBROUTINE' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'AND' Operator.Word ' ' Text.Whitespace 'S-DLL' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace "' '" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "'.exe'" Literal.String.Single ' ' Text.Whitespace 'DELIMITED' Keyword.Pseudo ' ' Text.Whitespace 'SIZE\n ' Keyword.Pseudo ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'S-ARGS' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACES' Name.Constant '\n' Text.Whitespace 'GC0809' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved "' '" Literal.String.Single ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'S-ARGS' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'OS-Unknown' Name.Variable ' ' Text.Whitespace 'OR' Operator.Word ' ' Text.Whitespace 'OS-Windows' Name.Variable '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace 'STRING ' Keyword.Reserved '\'"&&pause\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'STRING ' Keyword.Reserved '\';echo "Press ENTER to close...";read\'' Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INTO' Keyword.Pseudo ' ' Text.Whitespace 'Cmd' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WITH' Keyword.Pseudo ' ' Text.Whitespace 'POINTER' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-STRING\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '233' Literal.Number.Integer '-' Operator 'Run-Program' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'Blank-Screen' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY\n\n ' Keyword.Reserved ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'SYSTEM'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'TRIM' Name.Function '(' Punctuation 'Cmd' Name.Variable ',' Punctuation 'TRAILING' Keyword.Pseudo ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-CALL\n ' Keyword.Reserved ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '900' Literal.Number.Integer '-' Operator 'Terminate' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '239' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'EXIT' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '900' Literal.Number.Integer '-' Operator 'Terminate' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Display a message and halt the program **\n' Comment ' *****************************************************************\n' Comment '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '901' Literal.Number.Integer '-' Operator 'Display-Message' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Output-Message' Name.Variable ' ' Text.Whitespace '>' Operator ' ' Text.Whitespace 'SPACES' Name.Constant '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'Switches-Screen' Name.Variable '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-DISPLAY' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'CALL ' Keyword.Reserved "'C$SLEEP'" Literal.String.Single '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace '2\n' Literal.Number.Integer 'GC0909' Comment ' ' Text.Whitespace 'END-CALL' Keyword.Reserved '\n' Text.Whitespace 'GC0909' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'DISPLAY\n ' Keyword.Reserved ' ' Text.Whitespace 'Blank-Screen' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-DISPLAY\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '909' Literal.Number.Integer '-' Operator 'Done' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END' Keyword.Reserved ' ' Text.Whitespace 'PROGRAM' Keyword.Pseudo ' ' Text.Whitespace 'OCic' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IDENTIFICATION' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PROGRAM-ID' Keyword.Reserved '.' Punctuation ' ' Text.Whitespace 'GETOSTYPE' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** This subprogram determine the OS type the program is run- **\n' Comment ' ** ning under, passing that result back in RETURN-CODE as fol- **\n' Comment ' ** lows: **\n' Comment ' ** **\n' Comment ' ** 0: Cannot be determined **\n' Comment ' ** 1: Native Windows or Windows/MinGW **\n' Comment ' ** 2: Cygwin **\n' Comment ' ** 3: UNIX/Linux/MacOS **\n' Comment ' *****************************************************************\n' Comment ' ** DATE CHANGE DESCRIPTION **\n' Comment ' ** ====== ==================================================== **\n' Comment ' ** GC0909 Initial coding. **\n' Comment ' *****************************************************************\n' Comment ' ' Comment ' ' Text.Whitespace 'ENVIRONMENT' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'CONFIGURATION' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'REPOSITORY' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FUNCTION' Keyword.Pseudo ' ' Text.Whitespace 'ALL' Keyword.Pseudo ' ' Text.Whitespace 'INTRINSIC' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DATA' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WORKING-STORAGE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Env-Path' Name.Variable ' ' Text.Whitespace 'PIC X(1024)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Tally' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PROCEDURE' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '000' Literal.Number.Integer '-' Operator 'Main' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '010' Literal.Number.Integer '-' Operator 'Get-TEMP-Var' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Env-Path' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ACCEPT' Keyword.Reserved ' ' Text.Whitespace 'Env-Path' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace 'ENVIRONMENT ' Keyword.Reserved '"PATH"' Literal.String.Double '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ON' Keyword.Pseudo ' ' Text.Whitespace 'EXCEPTION\n ' Keyword.Pseudo ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '0 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'RETURN-CODE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved ' ' Text.Whitespace 'END-ACCEPT\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Env-Path' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACES\n ' Name.Constant ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '0 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'RETURN-CODE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '0 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Tally' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INSPECT' Keyword.Reserved ' ' Text.Whitespace 'Env-Path' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TALLYING' Keyword.Pseudo ' ' Text.Whitespace 'Tally' Name.Variable ' ' Text.Whitespace 'FOR' Keyword.Pseudo ' ' Text.Whitespace 'ALL ' Keyword.Pseudo '";"' Literal.String.Double '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Tally' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '0 ' Literal.Number.Integer '*> Must be some form of UNIX\n' Comment ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '0 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Tally' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INSPECT' Keyword.Reserved ' ' Text.Whitespace 'Env-Path' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'TALLYING' Keyword.Pseudo ' ' Text.Whitespace 'TALLY' Name.Variable ' ' Text.Whitespace 'FOR' Keyword.Pseudo ' ' Text.Whitespace 'ALL ' Keyword.Pseudo '"/cygdrive/"' Literal.String.Double '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Tally' Name.Variable ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace '0 ' Literal.Number.Integer '*> UNIX/MacOS\n' Comment ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '3 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'RETURN-CODE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ELSE ' Keyword.Reserved '*> Cygwin\n' Comment ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '2 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'RETURN-CODE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'ELSE ' Keyword.Reserved '*> Assume Windows[/MinGW]\n' Comment ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'RETURN-CODE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END' Keyword.Reserved ' ' Text.Whitespace 'PROGRAM' Keyword.Pseudo ' ' Text.Whitespace 'GETOSTYPE' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IDENTIFICATION' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PROGRAM-ID' Keyword.Reserved '.' Punctuation ' ' Text.Whitespace 'CHECKSOURCE' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** This subprogram will scan a line of source code it is given **\n' Comment ' ** looking for "LINKAGE SECTION" or "IDENTIFICATION DIVISION". **\n' Comment ' ** **\n' Comment ' ** ****NOTE**** ****NOTE**** ****NOTE**** ****NOTE*** **\n' Comment ' ** **\n' Comment ' ** These two strings must be found IN THEIR ENTIRETY within **\n' Comment ' ** the 1st 80 columns of program source records, and cannot **\n' Comment ' ** follow either a "*>" sequence OR a "*" in col 7. **\n' Comment ' *****************************************************************\n' Comment ' ** DATE CHANGE DESCRIPTION **\n' Comment ' ** ====== ==================================================== **\n' Comment ' ** GC0809 Initial coding. **\n' Comment ' *****************************************************************\n' Comment ' ' Comment ' ' Text.Whitespace 'ENVIRONMENT' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'CONFIGURATION' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'REPOSITORY' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FUNCTION' Keyword.Pseudo ' ' Text.Whitespace 'ALL' Keyword.Pseudo ' ' Text.Whitespace 'INTRINSIC' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DATA' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WORKING-STORAGE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Compressed-Src' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'CS-Char' Name.Variable ' ' Text.Whitespace 'OCCURS' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'TIMES' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Flags' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Found-SPACE' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Skipping-SPACE' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'Y'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'Not-Skipping-SPACE' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'N'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'I' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-CHAR' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'J' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-CHAR' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'LINKAGE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Argument-1' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '02 ' Literal.Number.Integer 'A1-Char' Name.Variable ' ' Text.Whitespace 'OCCURS' Keyword.Pseudo ' ' Text.Whitespace '80 ' Literal.Number.Integer 'TIMES' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Argument-2' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'A2-LINKAGE-SECTION' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'L'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'A2-IDENTIFICATION-DIVISION' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'I'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer '88' Literal.Number.Integer '-' Operator 'A2-Nothing-Special' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "' '" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PROCEDURE' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'Argument-1' Name.Variable ',' Punctuation ' ' Text.Whitespace 'Argument-2' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '000' Literal.Number.Integer '-' Operator 'Main' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '010' Literal.Number.Integer '-' Operator 'Initialize' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'A2-Nothing-Special' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'A1-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation '7' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'*'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '020' Literal.Number.Integer '-' Operator 'Compress-Multiple-SPACES' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Not-Skipping-SPACE' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace '0 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'J' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'SPACES' Name.Constant ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Compressed-Src' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'VARYING' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace '1 ' Literal.Number.Integer 'BY' Keyword.Pseudo ' ' Text.Whitespace '1\n ' Literal.Number.Integer 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace '>' Operator ' ' Text.Whitespace '80\n ' Literal.Number.Integer 'IF' Keyword.Reserved ' ' Text.Whitespace 'A1-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Not-Skipping-SPACE' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ADD' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'J' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'UPPER-CASE' Name.Function '(' Punctuation 'A1-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation ')' Punctuation ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CS-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'J' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Skipping-SPACE' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'ELSE\n ' Keyword.Reserved ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'Not-Skipping-SPACE' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'ADD' Keyword.Reserved ' ' Text.Whitespace '1 ' Literal.Number.Integer 'TO' Keyword.Pseudo ' ' Text.Whitespace 'J' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'MOVE' Keyword.Reserved ' ' Text.Whitespace 'A1-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'CS-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'J' Name.Variable ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '030' Literal.Number.Integer '-' Operator 'Scan-Compressed-Src' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace 'VARYING' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace 'FROM' Keyword.Pseudo ' ' Text.Whitespace '1 ' Literal.Number.Integer 'BY' Keyword.Pseudo ' ' Text.Whitespace '1\n ' Literal.Number.Integer 'UNTIL' Keyword.Pseudo ' ' Text.Whitespace 'I' Name.Variable ' ' Text.Whitespace '>' Operator ' ' Text.Whitespace '66\n ' Literal.Number.Integer 'EVALUATE' Keyword.Reserved ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'WHEN' Keyword.Pseudo ' ' Text.Whitespace 'CS-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'*'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Compressed-Src' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ' ' Text.Whitespace ':' Punctuation ' ' Text.Whitespace '2' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'*>'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo '(' Punctuation 'CS-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'L'" Literal.String.Single ')' Punctuation ' ' Text.Whitespace 'AND ' Operator.Word '(' Punctuation 'I' Name.Variable ' ' Text.Whitespace '<' Operator ' ' Text.Whitespace '66' Literal.Number.Integer ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Compressed-Src' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ' ' Text.Whitespace ':' Punctuation ' ' Text.Whitespace '15' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'LINKAGE SECTION'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'A2-LINKAGE-SECTION' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'WHEN ' Keyword.Pseudo '(' Punctuation 'CS-Char' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'I'" Literal.String.Single ')' Punctuation ' ' Text.Whitespace 'AND ' Operator.Word '(' Punctuation 'I' Name.Variable ' ' Text.Whitespace '<' Operator ' ' Text.Whitespace '58' Literal.Number.Integer ')' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Compressed-Src' Name.Variable ' ' Text.Whitespace '(' Punctuation 'I' Name.Variable ' ' Text.Whitespace ':' Punctuation ' ' Text.Whitespace '23' Literal.Number.Integer ')' Punctuation ' ' Text.Whitespace '=' Operator ' ' Text.Whitespace "'IDENTIFICATION '" Literal.String.Single ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace "'DIVISION'" Literal.String.Single '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SET' Keyword.Reserved ' ' Text.Whitespace '88' Literal.Number.Integer '-' Operator 'A2-IDENTIFICATION-DIVISION' Name.Variable ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'TRUE\n ' Name.Builtin ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'END-EVALUATE\n ' Keyword.Reserved ' ' Text.Whitespace 'END-PERFORM\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '099' Literal.Number.Integer '-' Operator 'Never-Found-Either-One' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END' Keyword.Reserved ' ' Text.Whitespace 'PROGRAM' Keyword.Pseudo ' ' Text.Whitespace 'CHECKSOURCE' Name.Variable '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IDENTIFICATION' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PROGRAM-ID' Keyword.Reserved '.' Punctuation ' ' Text.Whitespace 'LISTING' Name.Variable '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** This subprogram generates a cross-reference listing of an **\n' Comment ' ** OpenCOBOL program. **\n' Comment ' ** **\n' Comment ' ** Linkage: CALL "LISTING" USING **\n' Comment ' ** **\n' Comment ' ** **\n' Comment ' ** **\n' Comment ' ** Where: **\n' Comment ' ** is a PIC X(1) flag indicating **\n' Comment ' ** whether or not a source listing **\n' Comment ' ** should be produced (space=NO, **\n' Comment ' ** non-space=yes) **\n' Comment ' ** is a PIC X(1) flag indicating **\n' Comment ' ** whether or not an xref listing **\n' Comment ' ** should be produced (space=NO, **\n' Comment ' ** non-space=yes) **\n' Comment ' ** is the [path]filename of the **\n' Comment ' ** program being listed and/or **\n' Comment ' ** xreffed in a PIC X(256) form. **\n' Comment ' *****************************************************************\n' Comment ' ** **\n' Comment ' ** AUTHOR: GARY L. CUTLER **\n' Comment ' ** CutlerGL@gmail.com **\n' Comment ' ** Copyright (C) 2010, Gary L. Cutler, GPL **\n' Comment ' ** **\n' Comment ' ** DATE-WRITTEN: April 1, 2010 **\n' Comment ' ** **\n' Comment ' *****************************************************************\n' Comment ' ** DATE CHANGE DESCRIPTION **\n' Comment ' ** ====== ==================================================== **\n' Comment ' ** GC0410 Initial coding **\n' Comment ' ** GC0710 Handle duplicate data names (i.e. "CORRESPONDING" or **\n' Comment ' ** qualified items) better; ignore "END PROGRAM" recs **\n' Comment " ** so program name doesn't appear in listing. **\n" Comment ' *****************************************************************\n' Comment ' ' Comment ' ' Text.Whitespace 'ENVIRONMENT' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'CONFIGURATION' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'REPOSITORY' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FUNCTION' Keyword.Pseudo ' ' Text.Whitespace 'ALL' Keyword.Pseudo ' ' Text.Whitespace 'INTRINSIC' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INPUT-OUTPUT' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FILE-CONTROL' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SELECT' Keyword.Pseudo ' ' Text.Whitespace 'Expand-Code' Name.Variable ' ' Text.Whitespace 'ASSIGN' Keyword.Pseudo ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Expanded-Src-Filename' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ORGANIZATION' Keyword.Pseudo ' ' Text.Whitespace 'IS' Keyword.Pseudo ' ' Text.Whitespace 'LINE' Keyword.Pseudo ' ' Text.Whitespace 'SEQUENTIAL' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SELECT' Keyword.Pseudo ' ' Text.Whitespace 'Report-File' Name.Variable ' ' Text.Whitespace 'ASSIGN' Keyword.Pseudo ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Report-Filename' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ORGANIZATION' Keyword.Pseudo ' ' Text.Whitespace 'IS' Keyword.Pseudo ' ' Text.Whitespace 'LINE' Keyword.Pseudo ' ' Text.Whitespace 'SEQUENTIAL' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SELECT' Keyword.Pseudo ' ' Text.Whitespace 'Sort-File' Name.Variable ' ' Text.Whitespace 'ASSIGN' Keyword.Pseudo ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'DISK' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SELECT' Keyword.Pseudo ' ' Text.Whitespace 'Source-Code' Name.Variable ' ' Text.Whitespace 'ASSIGN' Keyword.Pseudo ' ' Text.Whitespace 'TO' Keyword.Pseudo ' ' Text.Whitespace 'Src-Filename' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ORGANIZATION' Keyword.Pseudo ' ' Text.Whitespace 'IS' Keyword.Pseudo ' ' Text.Whitespace 'LINE' Keyword.Pseudo ' ' Text.Whitespace 'SEQUENTIAL' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'DATA' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FILE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FD ' Keyword.Reserved ' ' Text.Whitespace 'Expand-Code' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Expand-Code-Rec' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'ECR-1' Name.Variable ' ' Text.Whitespace 'PIC X' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'ECR-2-256' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Expand-Code-Rec-Alt' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'ECR-1-128' Name.Variable ' ' Text.Whitespace 'PIC X(128)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'ECR-129-256' Name.Variable ' ' Text.Whitespace 'PIC X(128)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FD ' Keyword.Reserved ' ' Text.Whitespace 'Report-File' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Report-Rec' Name.Variable ' ' Text.Whitespace 'PIC X(135)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SD ' Keyword.Reserved ' ' Text.Whitespace 'Sort-File' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Sort-Rec' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SR-Prog-ID' Name.Variable ' ' Text.Whitespace 'PIC X(15)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SR-Token-UC' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SR-Token' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SR-Section' Name.Variable ' ' Text.Whitespace 'PIC X(15)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SR-Line-No-Def' Name.Variable ' ' Text.Whitespace 'PIC 9(6)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SR-Reference' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'SR-Line-No-Ref' Name.Variable ' ' Text.Whitespace 'PIC 9(6)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'SR-Ref-Flag' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'FD ' Keyword.Reserved ' ' Text.Whitespace 'Source-Code' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Source-Code-Rec' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SCR-1-128' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(6)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'SCR-7' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0410' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(121)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SCR-129-256' Name.Variable ' ' Text.Whitespace 'PIC X(128)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'WORKING-STORAGE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '78 ' Literal.Number.Integer 'Line-Nos-Per-Rec' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace '8' Literal.Number.Integer '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Cmd' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Delim' Name.Variable ' ' Text.Whitespace 'PIC X(2)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Detail-Line-S' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'DLS-Line-No' Name.Variable ' ' Text.Whitespace 'PIC ZZZZZ9' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'DLS-Statement' Name.Variable ' ' Text.Whitespace 'PIC X(128)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Detail-Line-X' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'DLX-Prog-ID' Name.Variable ' ' Text.Whitespace 'PIC X(15)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'DLX-Token' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'DLX-Line-No-Def' Name.Variable ' ' Text.Whitespace 'PIC ZZZZZ9' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'DLX-Section' Name.Variable ' ' Text.Whitespace 'PIC X(15)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'DLX-Reference' Name.Variable ' ' Text.Whitespace 'OCCURS' Keyword.Pseudo ' ' Text.Whitespace 'Line-Nos-Per-Rec' Name.Variable ' ' Text.Whitespace 'TIMES' Keyword.Pseudo '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'DLX-Line-No-Ref' Name.Variable ' ' Text.Whitespace 'PIC ZZZZZ9' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'DLX-Ref-Flag' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Dummy' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Env-TEMP' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Expanded-Src-Filename' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Filename' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Flags' Name.Variable '.' Punctuation '\n' Text.Whitespace 'GC0710' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Duplicate' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-First-Record' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-In-Which-Pgm' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'In-Main-Module' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'M'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'In-Copybook' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo "'C'" Literal.String.Single '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Last-Token-Ended-Sent' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Processing-PICTURE' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Token-Ended-Sentence' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace 'GC0710' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'F-Verb-Has-Been-Found' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Group-Indicators' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'GI-Prog-ID' Name.Variable ' ' Text.Whitespace 'PIC X(15)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'GI-Token' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Heading-1S' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(125)' Keyword.Type ' ' Text.Whitespace 'VALUE\n ' Keyword.Pseudo '"OpenCOBOL 1.1 06FEB2009 Source Listing - "' Literal.String.Double ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '"OCic Copyright (C) 2009-2010, Gary L. Cutler, GPL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'H1S-Date' Name.Variable ' ' Text.Whitespace 'PIC 9999/99/99' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Heading-1X' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(125)' Keyword.Type ' ' Text.Whitespace 'VALUE\n ' Keyword.Pseudo '"OpenCOBOL 1.1 06FEB2009 Cross-Reference Listing - "' Literal.String.Double ' ' Text.Whitespace '&' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '"OCic Copyright (C) 2009-2010, Gary L. Cutler, GPL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'H1X-Date' Name.Variable ' ' Text.Whitespace 'PIC 9999/99/99' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Heading-2' Name.Variable ' ' Text.Whitespace 'PIC X(135)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Heading-4S' Name.Variable ' ' Text.Whitespace 'PIC X(16)' Keyword.Type ' ' Text.Whitespace 'VALUE\n ' Keyword.Pseudo '"Line Statement"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Heading-4X' Name.Variable ' ' Text.Whitespace 'PIC X(96)' Keyword.Type ' ' Text.Whitespace 'VALUE\n ' Keyword.Pseudo '"PROGRAM-ID Identifier/Register/Function Defn Wher\n' Literal.String.Double ' ' Comment '-' Operator ' ' Text.Whitespace '"e Defined References (* = Updated)"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Heading-5S' Name.Variable ' ' Text.Whitespace 'PIC X(135)' Keyword.Type ' ' Text.Whitespace 'VALUE\n ' Keyword.Pseudo '"====== =====================================================\n' Literal.String.Double ' ' Comment '-' Operator ' ' Text.Whitespace '"============================================================\n' Literal.String.Double ' ' Comment '-' Operator ' ' Text.Whitespace '"==============="' Literal.String.Double '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Heading-5X' Name.Variable ' ' Text.Whitespace 'PIC X(135)' Keyword.Type ' ' Text.Whitespace 'VALUE\n ' Keyword.Pseudo '"=============== ================================ ====== ====\n' Literal.String.Double ' ' Comment '-' Operator ' ' Text.Whitespace '"=========== ================================================\n' Literal.String.Double ' ' Comment '-' Operator ' ' Text.Whitespace '"==============="' Literal.String.Double '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Held-Reference' Name.Variable ' ' Text.Whitespace 'PIC X(100)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'I' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'J' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Lines-Left' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Lines-Per-Page' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Lines-Per-Page-ENV' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Num-UserNames' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'PIC-X10' Name.Variable ' ' Text.Whitespace 'PIC X(10)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'PIC-X32' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'PIC-X256' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Program-Path' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Report-Filename' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Reserved-Words' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IABS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VACCEPT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ACCESS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IACOS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ACTIVE-CLASS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VADD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ADDRESS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ADVANCING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KAFTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALIGNED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VALLOCATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALPHABET"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALPHABETIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALPHABETIC-LOWER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALPHABETIC-UPPER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALPHANUMERIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALPHANUMERIC-EDITED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALSO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VALTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ALTERNATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AND"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IANNUITY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ANY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ANYCASE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ARE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AREA"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AREAS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ARGUMENT-NUMBER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ARGUMENT-VALUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ASCENDING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IASIN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ASSIGN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IATAN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AUTHOR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AUTO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AUTO-SKIP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AUTOMATIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" AUTOTERMINATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BACKGROUND-COLOR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BASED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BEEP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BEFORE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BELL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BINARY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BINARY-C-LONG"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BINARY-CHAR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BINARY-DOUBLE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BINARY-LONG"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BINARY-SHORT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BIT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BLANK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BLINK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BLOCK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BOOLEAN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" BOTTOM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"YBY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IBYTE-LENGTH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC01"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC02"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC03"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC04"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC05"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC06"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC07"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC08"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC09"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC10"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC11"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MC12"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VCALL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VCANCEL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CHAINING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ICHAR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CHARACTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CHARACTERS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CLASS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CLASS-ID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VCLOSE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ICOB-CRT-STATUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CODE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CODE-SET"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COLLATING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COLS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COLUMN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COLUMNS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ICOMBINED-DATETIME"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMMA"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMMAND-LINE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VCOMMIT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMMON"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMP-1"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMP-2"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMP-3"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMP-4"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMP-5"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMP-X"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMPUTATIONAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMPUTATIONAL-1"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMPUTATIONAL-2"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMPUTATIONAL-3"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMPUTATIONAL-4"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMPUTATIONAL-5"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COMPUTATIONAL-X"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VCOMPUTE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ICONCATENATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CONDITION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KCONFIGURATION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MCONSOLE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CONSTANT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CONTAINS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CONTENT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VCONTINUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CONTROL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CONTROLS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KCONVERTING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" COPY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CORR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CORRESPONDING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ICOS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KCOUNT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CRT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CURRENCY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ICURRENT-DATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CURSOR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" CYCLE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KDATA"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DATA-POINTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DATE-COMPILED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DATE-MODIFIED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IDATE-OF-INTEGER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IDATE-TO-YYYYMMDD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DATE-WRITTEN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DAY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IDAY-OF-INTEGER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DAY-OF-WEEK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IDAY-TO-YYYYDDD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DEBUGGING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DECIMAL-POINT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DECLARATIVES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DEFAULT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VDELETE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DELIMITED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KDELIMITER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DEPENDING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DESCENDING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DESTINATION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DETAIL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DISABLE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DISK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VDISPLAY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VDIVIDE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KDIVISION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KDOWN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DUPLICATES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" DYNAMIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EBCDIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VELSE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace 'GC0710' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KEND"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-ACCEPT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-ADD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-CALL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-COMPUTE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-DELETE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-DISPLAY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-DIVIDE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-EVALUATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-IF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-MULTIPLY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-OF-PAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-PERFORM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-READ"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-RETURN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-REWRITE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-SEARCH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-START"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-STRING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-SUBTRACT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-UNSTRING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" END-WRITE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VENTRY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KENVIRONMENT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ENVIRONMENT-NAME"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ENVIRONMENT-VALUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EOL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EOP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EOS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EQUAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KEQUALS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ERASE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ERROR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ESCAPE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VEVALUATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EXCEPTION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IEXCEPTION-FILE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IEXCEPTION-LOCATION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EXCEPTION-OBJECT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IEXCEPTION-STATEMENT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IEXCEPTION-STATUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EXCLUSIVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VEXIT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IEXP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IEXP10"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EXTEND"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" EXTERNAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IFACTORIAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FACTORY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FALSE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KFD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KFILE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FILE-CONTROL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FILE-ID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FILLER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FINAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FIRST"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-BINARY-16"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-BINARY-34"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-BINARY-7"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-DECIMAL-16"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-DECIMAL-34"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-EXTENDED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-LONG"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FLOAT-SHORT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FOOTING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FOR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FOREGROUND-COLOR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FOREVER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FORMAT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MFORMFEED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IFRACTION-PART"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VFREE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FROM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FULL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FUNCTION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FUNCTION-ID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" FUNCTION-POINTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VGENERATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" GET"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KGIVING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" GLOBAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VGO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VGOBACK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" GREATER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" GROUP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" GROUP-USAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" HEADING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" HIGH-VALUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" HIGH-VALUES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" HIGHLIGHT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" I-O"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" I-O-CONTROL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KIDENTIFICATION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VIF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" IGNORE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" IGNORING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" IN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INDEX"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KINDEXED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INDICATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INFINITY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INHERITS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INITIAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INITIALISED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VINITIALIZE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INITIALIZED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VINITIATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INPUT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KINPUT-OUTPUT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VINSPECT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INSTALLATION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IINTEGER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IINTEGER-OF-DATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IINTEGER-OF-DAY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IINTEGER-PART"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INTERFACE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INTERFACE-ID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KINTO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INTRINSIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INVALID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" INVOKE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" IS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" JUST"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" JUSTIFIED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" KEY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LABEL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LAST"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LEADING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LEFT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LEFT-JUSTIFY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILENGTH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LESS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LIMIT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LIMITS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LINAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILINAGE-COUNTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LINE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LINE-COUNTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LINES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KLINKAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KLOCAL-STORAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LOCALE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILOCALE-DATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILOCALE-TIME"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILOCALE-TIME-FROM-SECONDS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LOCK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILOG"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILOG10"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LOW-VALUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LOW-VALUES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LOWER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ILOWER-CASE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" LOWLIGHT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" MANUAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IMAX"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IMEAN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IMEDIAN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" MEMORY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VMERGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" METHOD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" METHOD-ID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IMIDRANGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IMIN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" MINUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IMOD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" MODE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VMOVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" MULTIPLE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VMULTIPLY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NATIONAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NATIONAL-EDITED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NATIVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NEGATIVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NESTED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VNEXT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NOT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NULL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NULLS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NUMBER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"INUMBER-OF-CALL-PARAMETERS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NUMBERS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NUMERIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" NUMERIC-EDITED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"INUMVAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"INUMVAL-C"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OBJECT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OBJECT-COMPUTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OBJECT-REFERENCE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OCCURS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OFF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OMITTED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ON"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ONLY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VOPEN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OPTIONAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OPTIONS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IORD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IORD-MAX"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IORD-MIN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ORDER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ORGANIZATION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OTHER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OUTPUT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OVERFLOW"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OVERLINE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" OVERRIDE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PACKED-DECIMAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PADDING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PAGE-COUNTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PARAGRAPH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VPERFORM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IPI"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KPIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KPICTURE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PLUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KPOINTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" POSITION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" POSITIVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PRESENT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IPRESENT-VALUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PREVIOUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MPRINTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PRINTING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KPROCEDURE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROCEDURE-POINTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROCEDURES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROCEED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROGRAM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KPROGRAM-ID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROGRAM-POINTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROMPT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROPERTY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" PROTOTYPE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" QUOTE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" QUOTES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RAISE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RAISING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IRANDOM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IRANGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VREAD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VREADY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RECORD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RECORDING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RECORDS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RECURSIVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KREDEFINES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REEL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REFERENCE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RELATIVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VRELEASE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IREM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REMAINDER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REMARKS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REMOVAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KRENAMES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KREPLACING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KREPORT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REPORTING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REPORTS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REPOSITORY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REPRESENTS-NOT-A-NUMBER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REQUIRED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RESERVE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RESUME"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RETRY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VRETURN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IRETURN-CODE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KRETURNING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IREVERSE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REVERSE-VIDEO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" REWIND"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VREWRITE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RIGHT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RIGHT-JUSTIFY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VROLLBACK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ROUNDED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" RUN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SAME"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KSCREEN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SCROLL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KSD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSEARCH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISECONDS-FROM-FORMATTED-TIME"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISECONDS-PAST-MIDNIGHT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KSECTION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SECURE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SECURITY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SEGMENT-LIMIT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SELECT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SELF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SENTENCE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SEPARATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SEQUENCE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SEQUENTIAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSET"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SHARING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISIGN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SIGNED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SIGNED-INT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SIGNED-LONG"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SIGNED-SHORT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISIN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SIZE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSORT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SORT-MERGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISORT-RETURN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SOURCE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SOURCE-COMPUTER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SOURCES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SPACE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SPACE-FILL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SPACES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SPECIAL-NAMES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISQRT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" STANDARD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" STANDARD-1"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" STANDARD-2"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISTANDARD-DEVIATION"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSTART"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" STATUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSTOP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISTORED-CHAR-LENGTH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSTRING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISUBSTITUTE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISUBSTITUTE-CASE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSUBTRACT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ISUM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SUPER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VSUPPRESS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-1"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-2"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-3"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-4"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-5"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-6"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-7"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSWITCH-8"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SYMBOLIC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SYNC"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SYNCHRONIZED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSYSERR"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSYSIN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSYSIPT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSYSLIST"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSYSLST"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"MSYSOUT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" SYSTEM-DEFAULT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TABLE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KTALLYING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ITAN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TAPE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VTERMINATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TEST"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ITEST-DATE-YYYYMMDD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ITEST-DAY-YYYYDDD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" THAN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" THEN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" THROUGH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" THRU"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TIME"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TIMES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KTO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TOP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TRAILING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TRAILING-SIGN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VTRANSFORM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"ITRIM"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TRUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TYPE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" TYPEDEF"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNDERLINE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNIT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNIVERSAL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VUNLOCK"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNSIGNED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNSIGNED-INT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNSIGNED-LONG"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNSIGNED-SHORT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VUNSTRING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UNTIL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KUP"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UPDATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UPON"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" UPPER"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IUPPER-CASE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" USAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VUSE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" USER-DEFAULT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KUSING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" VAL-STATUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" VALID"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" VALIDATE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" VALIDATE-STATUS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" VALUE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" VALUES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IVARIANCE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KVARYING"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" WAIT"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VWHEN"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IWHEN-COMPILED"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" WITH"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" WORDS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"KWORKING-STORAGE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"VWRITE"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"IYEAR-TO-YYYY"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" YYYYDDD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" YYYYMMDD"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ZERO"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ZERO-FILL"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ZEROES"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'FILLER' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(33)' Keyword.Type ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" ZEROS"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Reserved-Word-Table' Name.Variable ' ' Text.Whitespace 'REDEFINES' Keyword.Pseudo ' ' Text.Whitespace 'Reserved-Words' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'Reserved-Word' Name.Variable ' ' Text.Whitespace 'OCCURS' Keyword.Pseudo ' ' Text.Whitespace '591 ' Literal.Number.Integer 'TIMES\n ' Keyword.Pseudo ' ' Text.Whitespace 'ASCENDING' Keyword.Pseudo ' ' Text.Whitespace 'KEY' Keyword.Pseudo ' ' Text.Whitespace 'RW-Word' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INDEXED' Keyword.Pseudo ' ' Text.Whitespace 'RW-Idx' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'RW-Type' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'RW-Word' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Saved-Section' Name.Variable ' ' Text.Whitespace 'PIC X(15)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Search-Token' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Source-Line-No' Name.Variable ' ' Text.Whitespace 'PIC 9(6)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Src-Ptr' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Syntax-Parsing-Items' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Char' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Current-Char-Is-Punct' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"="' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"("' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '")"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"*"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"/"' Literal.String.Double ',' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '"&"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '";"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '","' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"<"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '">"' Literal.String.Double ',' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '":"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Current-Char-Is-Quote' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '\'"\'' Literal.String.Single ',' Punctuation ' ' Text.Whitespace '"\'"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Current-Char-Is-X' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"x"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"X"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Current-Char-Is-Z' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"z"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"Z"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Division' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'In-IDENTIFICATION-DIVISION' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"I"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"?"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'In-ENVIRONMENT-DIVISION' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"E"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'In-DATA-DIVISION' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"D"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'In-PROCEDURE-DIVISION' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"P"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Line-No' Name.Variable ' ' Text.Whitespace 'PIC 9(6)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Program-ID' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(12)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'SPI-CP-13-15' Name.Variable ' ' Text.Whitespace 'PIC X(3)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Section' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'SPI-CS-1' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'SPI-CS-2-14' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '15 ' Literal.Number.Integer 'FILLER ' Keyword.Pseudo ' ' Text.Whitespace 'PIC X(10)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '15 ' Literal.Number.Integer 'SPI-CS-11-14' Name.Variable ' ' Text.Whitespace 'PIC X(3)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '10 ' Literal.Number.Integer 'SPI-CS-15' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Token' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Token-UC' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Current-Verb' Name.Variable ' ' Text.Whitespace 'PIC X(12)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Next-Char' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Next-Char-Is-Quote' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '\'"\'' Literal.String.Single ',' Punctuation ' ' Text.Whitespace '"\'"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Prior-Token' Name.Variable ' ' Text.Whitespace 'PIC X(32)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '05 ' Literal.Number.Integer 'SPI-Token-Type' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Token-Is-EOF' Name.Variable ' ' Text.Whitespace 'VALUE' Keyword.Pseudo ' ' Text.Whitespace 'HIGH-VALUES' Name.Constant '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Token-Is-Identifier' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"I"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Token-Is-Key-Word' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"K"' Literal.String.Double ',' Punctuation ' ' Text.Whitespace '"V"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Token-Is-Literal-Alpha' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"L"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Token-Is-Literal-Number' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"N"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Token-Is-Verb' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '"V"' Literal.String.Double '.' Punctuation '\n' Text.Whitespace 'GC0710' Comment ' ' Text.Whitespace '88 ' Literal.Number.Integer 'Token-Is-Reserved-Word' Name.Variable ' ' Text.Whitespace 'VALUE ' Keyword.Pseudo '" "' Literal.String.Double '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Tally' Name.Variable ' ' Text.Whitespace 'USAGE' Keyword.Pseudo ' ' Text.Whitespace 'BINARY-LONG' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Todays-Date' Name.Variable ' ' Text.Whitespace 'PIC 9(8)' Keyword.Type '.' Punctuation '\n' Text.Whitespace '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'LINKAGE' Keyword.Reserved ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Produce-Source-Listing' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Produce-Xref-Listing' Name.Variable ' ' Text.Whitespace 'PIC X(1)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '01 ' Literal.Number.Integer 'Src-Filename' Name.Variable ' ' Text.Whitespace 'PIC X(256)' Keyword.Type '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace 'PROCEDURE' Keyword.Reserved ' ' Text.Whitespace 'DIVISION' Keyword.Reserved ' ' Text.Whitespace 'USING' Keyword.Pseudo ' ' Text.Whitespace 'Produce-Source-Listing' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'Produce-Xref-Listing' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'Src-Filename' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '000' Literal.Number.Integer '-' Operator 'Main' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace '001' Literal.Number.Integer '-' Operator 'Init' Name.Variable '.' Punctuation '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '100' Literal.Number.Integer '-' Operator 'Initialization' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '200' Literal.Number.Integer '-' Operator 'Execute-cobc' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'OPEN' Keyword.Reserved ' ' Text.Whitespace 'OUTPUT' Keyword.Pseudo ' ' Text.Whitespace 'Report-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Produce-Source-Listing' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'PERFORM' Keyword.Reserved ' ' Text.Whitespace '500' Literal.Number.Integer '-' Operator 'Produce-Source-Listing' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'IF' Keyword.Reserved ' ' Text.Whitespace 'Produce-Xref-Listing' Name.Variable ' ' Text.Whitespace 'NOT ' Operator.Word '=' Operator ' ' Text.Whitespace 'SPACE\n ' Name.Constant ' ' Text.Whitespace 'SORT' Keyword.Reserved ' ' Text.Whitespace 'Sort-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'ASCENDING' Keyword.Pseudo ' ' Text.Whitespace 'KEY ' Keyword.Pseudo ' ' Text.Whitespace 'SR-Prog-ID' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SR-Token-UC' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'SR-Line-No-Ref' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'INPUT' Keyword.Pseudo ' ' Text.Whitespace 'PROCEDURE ' Keyword.Reserved ' ' Text.Whitespace '300' Literal.Number.Integer '-' Operator 'Tokenize-Source' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'OUTPUT' Keyword.Pseudo ' ' Text.Whitespace 'PROCEDURE' Keyword.Reserved ' ' Text.Whitespace '400' Literal.Number.Integer '-' Operator 'Produce-Xref-Listing' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'END-IF\n ' Keyword.Reserved ' ' Text.Whitespace 'CLOSE' Keyword.Reserved ' ' Text.Whitespace 'Report-File' Name.Variable '\n' Text.Whitespace ' ' Comment ' ' Text.Whitespace 'GOBACK\n ' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' /\n' Comment ' ' Comment ' ' Text.Whitespace '100' Literal.Number.Integer '-' Operator 'Initialization' Name.Variable ' ' Text.Whitespace 'SECTION' Keyword.Reserved '.' Punctuation '\n' Text.Whitespace ' *****************************************************************\n' Comment ' ** Perform all program-wide initialization operations **\n' Comment ' *****************************************************************\n' Comment ' ' Comment ' ' Text.Whitespace 'END' Keyword.Reserved ' ' Text.Whitespace 'PROGRAM' Keyword.Pseudo ' ' Text.Whitespace 'LISTING' Name.Variable '.' Punctuation '\n' Text.Whitespace