The following table lists the SCA symbol classes and their
corresponding meanings in COBOL.
SCA Symbol Classes and Equivalent COBOL Language Terminology
SCA Term COBOL Term Explanation
Argument Program
argument
Component, Group item
Field
Constant, A character string whose value is
Literal specified by the ordered set of
characters it contains, or a reserve
word that is a figurative constant;
for example, "1.234E7", ZERO
Exception N/A
File File A file used during the compilation
Function, Program A program
Procedure,
Program,
Routine,
Subroutine
Generic N/A
Keyword Keyword A PDF keyword
Label Paragraph-
name or
section-name
Macro N/A
Module, N/A
Package
Placeholder Placeholder An LSE placeholder
Psect PSECT
Tag Tag A PDF tag
Task N/A
Type Datatype
Unbound Symbols in conditional compilation
lines
Variable Data item
The following table lists the SCA occurrence classes and their
corresponding meanings in COBOL.
SCA Occurrence Classes and Equivalent COBOL Language Terminology
SCA Term COBOL Term Explanation
Primary Declaration Data declarations, program ids
Associated Implicit declarations of called
programs the first time they are
seen
Declaration Declaration Both primary and associated
declarations
Read, Fetch FETCH
Write, Store STORE
Address, N/A
Pointer
Call CALL
Command_line A file specified on the command
line, for example, COBOL foo.cob
Include COPY
Precompiled N/A
Reference Reference Any nondeclaration
Explicit A variable declared by the user
Implicit A variable automatically defined by
the compiler
Visible Not hidden
Hidden Hidden occurrences may be due to
default conditions (for example,
PIC 9(4) is given the DISPLAY TYPE)
or within complex statement (for
example, COMPUTE and hidden write
references).
Compilation_ SCP
unit separately
compiled unit
The following table lists the SCA domain classes and their
corresponding meanings in COBOL.
SCA Domain Classes and Equivalent COBOL Language Terminology
SCA Term COBOL Term Explanation
Inheritable N/A
Global EXTERNAL
Predefined PREDEFINED For example, special registers
Multi_module Global and predefined
Module_ Not multi-module
specific