beginning_cobol_for_programmers_index

Beginning COBOL for Programmers Index

COBOL Programming Language, COBOL Source File, COBOL .cbl File Extension, COBOL .cob File Extension, COBOL .cobol File Extension, COBOL Compiler, COBOL Compilation Unit, COBOL Run-time System, COBOL Environment Division, COBOL Identification Division, COBOL Procedure Division, COBOL Data Division, COBOL Configuration Section, COBOL Input-Output Section, COBOL File-Control Paragraph, COBOL I-O Control Paragraph, COBOL File Section, COBOL Working-Storage Section, COBOL Local-Storage Section, COBOL Linkage Section, COBOL Communication Section, COBOL Report Section, COBOL FD Entry (File Descriptor), COBOL SD Entry (Sort Descriptor), COBOL SELECT Statement, COBOL ASSIGN Clause, COBOL ORGANIZATION Clause, COBOL ACCESS MODE, COBOL SEQUENTIAL Access, COBOL RELATIVE Access, COBOL INDEXED Access, COBOL RECORD KEY Clause, COBOL ALTERNATE KEY Clause, COBOL DYNAMIC Access Mode, COBOL RANDOM Access Mode, COBOL KEY IS Clause, COBOL LINAGE Clause, COBOL BLOCK CONTAINS Clause, COBOL RECORD CONTAINS Clause, COBOL RECORDING MODE Clause, COBOL LABEL RECORDS Clause, COBOL CODE-SET Clause, COBOL FILE STATUS Clause, COBOL FD (File Description) Entry, COBOL FILE SECTION Variables, COBOL WORKING-STORAGE Variables, COBOL 01 Level Number, COBOL 77 Level Number, COBOL 66 Level Number, COBOL 88 Level Number (Condition Names), COBOL PIC Clause (Picture), COBOL USAGE Clause, COBOL DISPLAY Usage, COBOL COMP Usage, COBOL COMP-3 (Packed Decimal), COBOL COMP-1 (Floating Point) , COBOL COMP-2 (Floating Double) , COBOL COMP-4 Equivalent to COMP, COBOL COMP-5 (Native Binary) , COBOL SIGN SEPARATE Clause, COBOL SIGN TRAILING Clause, COBOL JUSTIFIED RIGHT Clause, COBOL SYNCHRONIZED Clause, COBOL OCCURS Clause, COBOL OCCURS DEPENDING ON Clause, COBOL REDEFINES Clause, COBOL RENAMES Clause, COBOL VALUE Clause, COBOL VALUE IS Clause, COBOL FILLER Keyword, COBOL ACCEPT Statement, COBOL DISPLAY Statement, COBOL MOVE Statement, COBOL ADD Statement, COBOL SUBTRACT Statement, COBOL MULTIPLY Statement, COBOL DIVIDE Statement, COBOL COMPUTE Statement, COBOL INITIALIZE Statement, COBOL STRING Statement, COBOL UNSTRING Statement, COBOL INSPECT Statement, COBOL PERFORM Statement, COBOL PERFORM UNTIL, COBOL PERFORM VARYING, COBOL PERFORM THRU, COBOL EXIT Statement, COBOL STOP RUN Statement, COBOL GOBACK Statement, COBOL EVALUATE Statement, COBOL WHEN Clause (EVALUATE), COBOL CONTINUE Statement, COBOL NEXT SENTENCE Statement, COBOL IF Statement, COBOL ELSE Clause, COBOL END-IF Statement, COBOL GO TO Statement, COBOL ALTER Statement (Obsolete), COBOL SORT Statement, COBOL MERGE Statement, COBOL RELEASE Statement (for SORT), COBOL RETURN Statement (for SORT), COBOL SEARCH Statement, COBOL SEARCH ALL (Binary Search), COBOL CALL Statement, COBOL CANCEL Statement, COBOL LINKAGE SECTION Variables, COBOL USING Clause (in Procedure Division), COBOL EXIT PROGRAM Statement, COBOL ENTRY Statement (Obsolete), COBOL COPY Statement, COBOL REPLACE Directive, COBOL EJECT Directive, COBOL SKIP Directive, COBOL SERVICE RELOAD (IBM Extension, COBOL INTRINSIC FUNCTIONS, COBOL FUNCTION Keyword, COBOL CURRENT-DATE Function, COBOL NUMVAL Function, COBOL NUMVAL-C Function, COBOL WHEN-COMPILED Function, COBOL RANDOM Function, COBOL REM Function, COBOL LENGTH Function, COBOL MAX Function, COBOL MIN Function, COBOL MOD Function, COBOL SUBSTRING Function, COBOL UPPER-CASE Function, COBOL LOWER-CASE Function, COBOL NATIONAL-OF Function, COBOL DISPLAY-OF Function, COBOL TEST Function (in some compilers, COBOL EXAMINE Statement (Old name of INSPECT), COBOL CLASS Condition, COBOL ALPHABETIC Class Condition, COBOL ALPHANUMERIC Class Condition, COBOL NUMERIC Class Condition, COBOL JUSTIFIED Clause (in PIC), COBOL SYNCHRONIZED Clause repeated, COBOL ON SIZE ERROR Clause, COBOL ON OVERFLOW Clause, COBOL ON EXCEPTION Clause, COBOL INVALID KEY Clause, COBOL END-ADD Statement (in COBOL 2002+, COBOL END-SUBTRACT Statement, COBOL END-MULTIPLY Statement, COBOL END-DIVIDE Statement, COBOL END-COMPUTE Statement, COBOL END-PERFORM Statement, COBOL END-READ Statement, COBOL END-WRITE Statement, COBOL END-REWRITE Statement, COBOL END-DELETE Statement, COBOL END-RETURN Statement, COBOL END-SEARCH Statement, COBOL END-IF repeated, COBOL END-STRING Statement, COBOL END-UNSTRING Statement, COBOL END-INSPECT Statement, COBOL END-ACCEPT Statement, COBOL END-DISPLAY Statement, COBOL In-Line PERFORM, COBOL Nested Programs, COBOL END PROGRAM Header, COBOL CALL BY CONTENT, COBOL CALL BY REFERENCE, COBOL CALL BY VALUE, COBOL INITIAL Program Attribute, COBOL RECURSIVE Program Attribute, COBOL EXPORT and IMPORT (Some compilers support, COBOL ENTRY POINTS in Program, COBOL Debugging Lines (D in col 7), COBOL Comment Lines (*) in col 7, COBOL Continuation Lines (- in col 7), COBOL Fixed Format Source Columns, COBOL Column 7 Indicators, COBOL Column 72 Limit, COBOL Free Format (COBOL 2002+) , COBOL *CONTROL Compiler Directive, COBOL *CBL Compiler Directive, COBOL $ SET Compiler Directive (IBM), COBOL ADV Compiler Option, COBOL SSRANGE Compiler Option, COBOL APOST Compiler Option, COBOL RENT Compiler Option, COBOL MAP Compiler Option, COBOL OPTIMIZE Compiler Option, COBOL NOOPTIMIZE Compiler Option, COBOL INSPECT TALLYING, COBOL INSPECT REPLACING, COBOL INSPECT CONVERTING, COBOL STRING DELIMITED BY, COBOL UNSTRING DELIMITED BY, COBOL POINTER IN STRING/UNSTRING, COBOL SUBScripting Arrays (OCCURS), COBOL OCCURS Depending On Variables, COBOL Table Handling, COBOL SEARCH VERB, COBOL SEARCH ALL VERB, COBOL SORT VERB, COBOL MERGE VERB, COBOL USE FOR DEBUGGING ON Statement, COBOL USE Global Declarative, COBOL DECLARATIVES Section, COBOL END DECLARATIVES, COBOL FILE STATUS Checking, COBOL EXTEND MODE for files, COBOL REWRITE Statement, COBOL DELETE Statement (for indexed files), COBOL START Statement (indexed file positioning), COBOL READ NEXT, COBOL READ PREVIOUS (not standard widely COBOL READ KEY Is Clause, COBOL WRITE FROM Clause, COBOL WRITE ADVANCING PAGE, COBOL WRITE AFTER ADVANCING LINES, COBOL WRITE BEFORE ADVANCING, COBOL Page-Controlled Reports (REPORT SECTION), COBOL Report Writer Feature (Obsolete in some implementations), COBOL RH, PH, PF, DE, etc. in REPORT)], [[COBOL SPECIAL-NAMES Paragraph, COBOL DECIMAL-POINT IS COMMA, COBOL CURRENCY SIGN Clause, COBOL CLASS Alphabet Name Definition, COBOL SYMBOLIC CHARACTERS, COBOL CRT STATUS Phrase (Old terminals), COBOL ADVANCING Control in WRITE, COBOL Nonnumeric Literals, COBOL Numeric Literals, COBOL PICTURE Clause (PIC), COBOL PIC 9 for digits, COBOL PIC X for alphanumeric, COBOL PIC A for alphabetic, COBOL PIC S for sign, COBOL PIC V for implied decimal, COBOL PIC P for scaling position, COBOL JUSTIFIED RIGHT Clause in PIC, COBOL BLANK WHEN ZERO Clause, COBOL ZERO SUPPRESSION, COBOL SIGN LEADING SEPARATE, COBOL SIGN TRAILING SEPARATE, COBOL USING in PROCEDURE DIVISION, COBOL GIVING/RETURNING in CALL, COBOL CANCEL Program, COBOL LINKAGE SECTION Parameters, COBOL EXTERNAL Name Clause, COBOL GLOBAL Clause for Data, COBOL COMMON Data, COBOL INITIAL Clause on Programs, COBOL IDENTIFICATION DIVISION PROGRAM-ID, COBOL AUTHOR Paragraph, COBOL INSTALLATION Paragraph, COBOL DATE-WRITTEN Paragraph, COBOL DATE-COMPILED Paragraph, COBOL SECURITY Paragraph, COBOL REMARKS Paragraph (Obsolete), COBOL Class Condition Checks, COBOL Condition-Names (88 Level), COBOL LEVEL 88 Definition, COBOL SET condition-name TO TRUE, COBOL SET condition-name TO FALSE, COBOL SET variable TO value, COBOL SET ... UP/DOWN BY value (for indexes), COBOL ACCEPT FROM DATE, COBOL ACCEPT FROM DAY, COBOL ACCEPT FROM DAY-OF-WEEK, COBOL ACCEPT FROM TIME, COBOL ACCEPT FROM COMMAND-LINE (Extension, COBOL ACCEPT FROM ENVIRONMENT (Extension, COBOL DISPLAY UPON], [COBOL DISPLAY WITH NO ADVANCING, COBOL READY TRACE (Obsolete Debug feature), COBOL USE AFTER ERROR Declarative, COBOL USE AFTER EXCEPTION Declarative, COBOL USE AFTER STANDARD Declarative, COBOL EXIT PARAGRAPH Statement, COBOL EXIT Perform CYCLE, COBOL EXIT Perform Loop

COBOL: Effective IBM Enterprise COBOL, Object-Oriented Programming for COBOL - Object-Oriented COBOL, COBOL Best Practices, COBOL FAQ, COBOL Standards (ISO COBOL-2023 - ISO/IEC 1989-2023 Standard), IBM Enterprise COBOL for z/OS, Deprecated / Defunct Micro Focus Visual COBOL - Visual COBOL - Managed COBOL from Micro Focus (JVM COBOL and dot NET COBOL | NET COBOL), COBOL Fundamentals, COBOL Inventor - COBOL Language Designer: 1959 by Howard Bromberg COBOL | Howard Bromberg, Norman Discount COBOL | Norman Discount, Vernon Reeves COBOL | Vernon Reeves, Jean E. Sammet, William Selden COBOL | William Selden, Gertrude Tierney COBOL | Gertrude Tierney, with indirect influence from Grace Hopper, CODASYL, ANSI COBOL, ISO/IEC COBOL; Modern COBOL - Legacy COBOL, IBM COBOL, COBOL keywords, COBOL data structures - COBOL algorithms, COBOL syntax, Visual COBOL, COBOL on Windows, COBOL on Linux, COBOL on UNIX, COBOL on macOS, Mainframe COBOL, IBM i COBOL, IBM Mainframe DevOps, COBOL Paradigms (Imperative COBOL, Procedural COBOL, Object-Oriented COBOL - COBOL OOP, Functional COBOL), COBOL syntax, COBOL installation, COBOL containerization, COBOL configuration, COBOL compilers, COBOL IDEs, COBOL development tools, COBOL DevOps - COBOL SRE, COBOL data science - COBOL DataOps, COBOL machine learning, COBOL deep learning, COBOL concurrency, COBOL history, COBOL bibliography, COBOL Glossary - Glossaire de COBOL - French, COBOL topics, COBOL courses, COBOL Standard Library, COBOL libraries, COBOL frameworks, COBOL research, Grace Hopper, COBOL GitHub, Written in COBOL, COBOL popularity, COBOL Awesome list, COBOL Versions. (navbar_cobol - see also navbar_mainframe, navbar_fortran)

A

B

C

Class conditions

example program

metalanguage

numeric tests

StateName capitals

UserDefinedClassName

Closed subroutines

CLOSE statement

COBOL

application domain

characteristics

domain-independent languages

version

bespoke application

bug-free status

characteristics

enormous volumes

maintainable

many programming shops

mission-critical applications

module version log

nonproprietary

self-documenting programming language

simple language

stable

coding rules

See(see Coding rules)

compiler

Fujitsu NetCOBOL compiler

Micro Focus Visual compiler

online compiler

open source COBOL compiler

Raincode compiler

conspiracy-theory

crisis and opportunity

definition

DoCalc program

enterprise computing

greeting program

hidden asset

hierarchical program structure

divisions

See(see Divisions, COBOL program)

paragraph

sections

sentence

statements

high-level programming language

history

idiosyncrasies

legacy system

automatic language conversion

code renovation

commodity hardware and software

complete rewrite

COTS package

danger, difficulty and expense

wrapping

metalanguage syntax

COMPUTE statement

diagram

notation

operand suffixes

references

standards

COBOL ANS 4

COBOL ANS 74 (External Subprograms)

COBOL ANS 85 (Structured Programming Constructs)

COBOL ANS 2002 (OO Constructs)

target application domain

using EVALUATE Verb

COBOL subroutines

Coding rules

coding sheet

name construction

data-item names

program formatting

programming style

Common Business Oriented Language (COBOL).

See See COBOL

Compiler

Fujitsu NetCOBOL compiler

Micro Focus Visual compiler

online compiler

open source COBOL compiler

Raincode compiler

Complex conditions

bracketing

cursor detection

metalanguage

OR, AND truth tables

precedence rules

COMPUTE statement

Condition names

correct use of

Date-Validation Error Message

definition

multiple names

numeric or alphabetic values

overlapping and multiple-value names

rules

single name and value

whole word values

design patterns

sequential file reading

example program

group item

set to true

SET verb examples

SET verb metalanguage

Control-break processing

detection

program template

program writing

specifications required

single control break

three control breaks

two control breaks

three-level control break

program implementation

test data file

typical control break

program implementation

specification required

test data file

Control structures

iteration

See(see Iteration constructs)

selection

See(see Selection constructs)

D

Data declaration

assignment operation

alphanumeric MOVEs

data types

MOVE combinations

MOVE rules

MOVE syntax

MOVE verb

numeric MOVEs

categories

data item (variables)

elementary item

figurative constants

literals

data items

example declarations

PICTURE clauses

exercise

answers

question

numeric MOVEs

example set 1

example set 2

structured data

data hierarchy

group item

level number(s)

level number relationships govern hierarchy

Data type enforcement

Date-Validation Error Message

Decimal arithmetic

fixed-point

floating-point

Decision tables

Direct access files

COBOL file organizations

relative file

See(see Relative file organization)

sequential file

See(see Sequential file organization)

indexed files

applied transactions

index file combination

See(see Index file combination)

key references

reading an indexed file

See(See Reading an indexed file)

SELECT and ASSIGN clause

verbs

See(see Index file verbs)

sequential file

index file organization

alternate-key index

data buckets

primary-key index

processing relative files

Reads

See(see Reading a relative file)

sequential file

transactions

See(see Relative file transaction)

relative file

SELECT and ASSIGN clause

verbs

See(see Relative file verbs)

relative files organization

one-dimensional table

records

single numeric key

sparsely populated

vs.sequential files

DISPLAY verb

Divisions, COBOL program

CONFIGURATION SECTION

DATA DIVISION

FILE SECTION

WORKING-STORAGE SECTION

ENVIRONMENT DIVISION

hierarchical data declaration

IDENTIFICATION DIVISION

PROCEDURE DIVISION

ShortestProgram

Domain-independent languages

E

F

G

H

I, J, K

L

M

N

O

P, Q

R

Raincode compiler

RANDOM intrinsic function

Reading an indexed file

data division

environment division

GetFilmByDirectorId

procedure division

RELATIVE KEY entry

working-storage section

Reading a Relative File

data division

display record

environment division

FILE STATUS clause

procedural division

READ verb

READ statement

data storage

employee.dat file

syntax description

test data file

with records display

Record

buffer

buffer declaration

creation

declarations

occurrence

template

REDEFINES clause

Aromamora PLC specification

See(see Aromamora Base Oil Sales report)

data items

percentages

semantic rules

syntax metalanguage

time conversions

UNSTRING statement

Registers

LINE-COUNTER

PAGE-COUNTER

Relation conditions

metalanguage

samples

Relative file organization

advantages

disadvantages

indexed file

one-dimensional table

Relative file transaction

content

DisplayVehicleRecords

file processing verbs

sequential file to

Relative file verbs

DELETE verb

INVALID KEY clause

OPEN/CLOSE syntax

read verb

ACCESS MODE

direct read, metalanguage

sequential read, metalanguage

REWRITE verb

START verb

metalanguage for

position controller

write verb

RENAMES clause

identification division

procedure division

semantic rules

syntax metalanguage

working-storage section

REPLACING phrase

Report writer

book file

control-break processing

declaratives

COLUMN NUMBER clause

control-break register

crossfooting

elementary print items

ENVIRONMENT DIVISION

FILE SECTION

group definition

GROUP INDICATE clause

handle unexpected file errors

LINE NUMBER clause

NEXT GROUP clause

print lines

Report Description (RD)

RESET ON clause

rolling forward

SOURCE clause

structure of

subtotaling

SUM clause

SUPPRESS PRINTING statement

TYPE clause

version of USE

group types

layout requirement

print specification

PROCEDURE DIVISION

GENERATE verb

INITIATE verb

TERMINATE verb

program creation

CONTROL FOOTING group

DATA DIVISION

DETAIL group

features

PAGE FOOTING group

PAGE HEADING group

PROCEDURE DIVISION

REPORT HEADING group

REPORT SECTION

specification modification

SUM clause

WORKING-STORAGE SECTION

publisher file

registers

LINE-COUNTER

PAGE-COUNTER

solace solar

first page

PROCEDURE DIVISION

specification

tasks

ROUNDED Phrase

S

SEARCH ALL verb

binary search algorithm

KEY IS clause

metalanguage

SEARCH verb

advantages

American states

letter position

metalanguage

two-dimensional table

declarations

graphical depiction

JeansSalesTable

SELECT and ASSIGN clause

declarations

extension

syntax

usage

Selection constructs

condition names

correct use of

Date-Validation Error Message

design patterns

example program

group item

multiple names

numeric or alphabetic values

overlapping and multiple-value names

rules

set to true

SET verb examples

SET verb metalanguage

single name and value

whole word values

EVALUATE

Acme Book Club example

amusement park example

decision tables

metalanguage

objects

payment totals example

subjects

WHEN branch rules

IF statement

class conditions

complex conditions

END-IF vs. period

relation conditions

sign conditions

implied] [[subjects

nested IF statements

practical exercises

Sequential file(s)

CLOSE statement

control-break processing

detection

program writing

specifications required

template

three-level control break

See(see Control break processing)

typical control break

See(see Control break processing)

data organization

file organization vs. method of access

file update program

program implementation

test data file

method of access

multiple record types

implications

problem specifications

record buffer

type code

See(see Type code)

OPEN statement

ordered and unordered files

practical exercises

printer files

multiple record types, problems

multiple record types, solutions

Report Writer

select and assign

WRITE statement

reading

READ statement

data storage

employee.dat file

syntax description

test data file

with records display

update files

file-update problem

See(see File-update problem)

key field

ordered sequential file

See(see Ordered sequential file)

record matching

transaction file

variable-length records

FD entries

program implementation

varying phrase

WRITE statement

reading and writing to employee file

WRITE..FROM

writing record and reading file

writing records to file end

Sequential file organization

advantages

disadvantages

SET verb

Sign conditions

Software System creation

CALL verb

CANCEL verb

external subprogram

getting state information

IS COMMON PROGRAM Clause

IS EXTERNAL Clause

See(see IS EXTERNAL Clause)

IS EXTERNAL Data Items

See(see IS EXTERNAL Data Items)

IS GLOBAL Clause

IS INITIAL Phrase

knowledge game

metalanguage

parameter passing and data visibility

parameter-passing mechanisms

subprograms

See(see Subprograms)

uses

using COMMON Subprogram

COPY verb

copy library

COPY Statement

COPY Statements with REPLACEMENT Text

data resource

library statement

metalanguage

REPLACING phrase

subprograms

Solace solar

first page

PROCEDURE DIVISION

specification

tasks

String concatenation

definition

STRING verb

DELIMITED BY SIZE clause

JUSTIFIED clause

metalanguage

ON OVERFLOW clause

Pointer

  1. i

reference modification

rules

statement

WITH POINTER phrase

String manipulation

String splitting

COUNT IN clause

definition

program

TALLYING clause

UNSTRING verb

ALL phrase

COUNT IN clause

DELIMITED BY clause

DELIMITER IN phrase

END-UNSTRING

metalanguage

ON OVERFLOW clause

reference modification

statement

TALLYING clause

WITH POINTER clause

STRING verb

DELIMITED BY SIZE clause

JUSTIFIED clause

metalanguage

ON OVERFLOW clause

Pointer

  1. i

reference modification

rules

statement

WITH POINTER phrase

Strongly typed languages

Subprograms

contained subprograms

vs.external subprograms

EXIT PROGRAM

LINKAGE SECTION

literal value

Subroutines

closed subroutines

COBOL subroutines

open subroutines

T

U

V

W, X, Y

Z

beginning_cobol_for_programmers_index.txt · Last modified: 2025/02/01 07:15 by 127.0.0.1

Donate Powered by PHP Valid HTML5 Valid CSS Driven by DokuWiki