CA

Category

Program Painter and Specification Editor keyword (see Keywords)

Description:

Redefine the TP-USERAREA field of the Commarea. To pass data between programs, see TP-COMMAREA.

Syntax:

Comments:

Example:
-KYWD-  12-*----20---*----30---*----40---*----50---*----60
 IO     INPUT-FILE ASSIGN TO UT-S-INPUT
 IO     OUTPUT-FILE ASSIGN TO UT-S-OUTPUT
 FD     INPUT-FILE
        LABEL RECORDS ARE STANDARD
        BLOCK CONTAINS 0 RECORDS
 01     INPUT-REC        PIC X(80).
 DS01   INPUTREC
 FD     OUTPUT-FILE 
        LABEL RECORDS ARE STANDARD
        BLOCK CONTAINS 0 RECORDS
 REC    OUTPUT-REC       X80
 01     OUTPUT-REC-R REDEFINES OUTPUT-REC. 
        ...COPY OUTREC.
 CA     CA-INPUT-REC 
          CA-IN-PART-NO       N8
          CA-IN-DESC          X50
          CA-IN-BASE-PRICE    N6V2
 CADS   CAOUTREC 

CCODE

Compatibility

IMS DB target

Description:

Use CCODE to include additional IMS command codes in DB-OBTAIN, DB-MODIFY, DB-PROCESS, and DB-STORE.

Syntax:

Valid IMS CCODEs are:

P

Establish parentage at this level.

Q

Enqueue the segment.

U

Maintain current position at this level.

-

Null command code.

APS generates the following IMS CCODEs; do not code them yourself.

D

Put segment in I/O area (generated by REC).

F

Locate first occurrence (generated by FIRST).

L

Locate last occurrence (generated by LAST).

N

Do not replace segment (generated by REF).

V

Maintain current position at this level (generated by CURRENT).

For more information, refer to the applicable IMS manuals.

Comments:

Example:

Retrieve and enqueue RECORD-A and make it unavailable to other processing until the program terminates or explicitly frees the record with a checkpoint call.

DB-OBTAIN REC RECORD-A
... WHERE KEY-A = WS-KEY-A CCODE 'Q'
... REC RECORD-B
... WHERE KEY-B = WS-KEY-B
... VIEW PCBNAME RESET

Checkin

Category

ENDEVOR Interface feature

Description:

Add to or update the ENDEVOR library with an APS component from an APS Project Group. Alternatively, sign in a component at check in, without adding to or updating the ENDEVOR library. To retrieve a member from the library, see Checkout.

From the APS/ENDEVOR Version Control Menu, select option 1, Checkin. Alternatively, enter CI in the Command field on any APS screen.

Specify requirements on the Checkin screen, as follows.

Field
Description and Values

Entity Type

Entity type of the APS component to check in. Valid values are:

 

ap

Application Painter component in APSAPPL plus its related component in APRAPPL

 

cn

Scenario Painter component in APSCNIO

 

ds

Data Structure Painter component in APSDATA

 

ox

Online Express component in APSEXPS

 

pg

Program Painter component in APSPROG plus its related component in APRPROG

 

rp

Report Mock-up Painter component in APSREPT

 

sc

Screen Painter component in APSSCRN

 

For other APS component types in your Project.Group, specify a data set name, such as USERMACS and DDISYMB.

Member

Component name to check in, or leave the Member field blank to select from a member list.

System

ENDEVOR System name, if it differs from the default System name for your current APS Project.Group.

Subsystem

ENDEVOR Subsystem name, if it differs from the default Subsystem name for your current APS Project.Group.

Comment

Text comment for the check in.

CCID

ENDEVOR CCID for the check in.

Bypass Gen Processor

Specify yes to bypass the associated ENDEVOR Generate Processor.

Delete Input Source

Specify yes to delete the component from the APS Project.Group.

Processor Group

Name of the ENDEVOR Processor Group.

Override Signout

Specify yes to override an existing signout. You must have authority to do so.

Signin Only

Specify yes to Signin only, releasing a previous signout of the component issued with your user ID; the Add or Update action is not executed.

Stage

ENDEVOR Stage number for signin.

Component Parts

For checking in AP and PG component type components. Valid values are:

 

none

Default. Process only the component specified in the Member field.

 

all

Process the component specified in the Member field and all its associated component parts, or components.

 

list

Display the Component Types Selection screen, to select the associated component types for processing.

 

APS submits a batch job to perform the check in when some or all component parts are checked in with the component specified in the Member field.


Checkout

Category

ENDEVOR Interface feature

Description:

Retrieve and, by default, sign out a revision from a controlled member of the ENDEVOR library to an APS Project Group so that you can modify it. To add or update the library, see Checkin.

From the APS/ENDEVOR Version Control Menu, select option 2, Checkout. Alternatively, enter CO in the Command field on any APS screen.

Specify requirements on the Checkout screen, as follows.

Field
Description and Values

Entity Type

Component Type of the component to check out. Valid values same as for Checkin.

Member

Member name to check out, or leave the Member field blank to select from a member list.

System

ENDEVOR System name, if it differs from the default System name for your current APS project.group.

Subsystem

ENDEVOR Subsystem name, if it differs from the default Subsystem name for your current APS Project.Group.

Stage

ENDEVOR Stage number of the member to check out.

Version

Default to the current revision. You can optionally override this value with another version number.

Level

Default to the current level. You can optionally override this value with another level number.

Comment

Text comment for the check out.

CCID

ENDEVOR CCID to associate with the check out.

No Signout

Specify yes to check out and browse the member without signing it out to your user ID.

Replace Member

Specify yes to overlay an existing member in the APS project.group.

Override Signout

Specify yes to override an existing Signout by another user. You must have authority to do so.

Component Parts

For checking out AP and PG component type components. Valid values are:

 

none

Default. Process only the component specified in the Member field.

 

all

Process the component specified in the Member field and all its associated component parts, or components.

 

list

Display the Component Types Selection screen, to select the associated component types for processing.

 

APS submits a batch job to perform the check in when some or all component parts are checked in with the component specified in the Member field.


CIC-ADDRESS

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Use with the TP-LINKAGE call (TP-LINKAGE) to access CICS storage areas.

Syntax:
CIC-ADDRESS option(linkdataname) [option(linkdataname) ...]
Parameters:

option

CWA

Common Work Area

 

TCTUA

Terminal Control Table User Area

 

TWA

Transaction Work Area

 

CSA

Common Storage Area (z/OS target only)

 

EIB

Execute Interface Block (z/OS target only)

linkdataname

01-level Linkage Section data area identical to the linkdataname in the associated TP-LINKAGE call.

Example:

Pass information to the application program. Set the Linkage Section data area (LK-CWA) in the current program to the address of the CWA for access.

-KYWD-  12-*----20---*----30---*----40---*----50---*----60
 SYLK   TP-LINKAGE LK-CWA
 LK01   LK-CWA              PIC X(200).
 NTRY   CIC-ADDRESS CWA(LK-CWA)

CIC-ASSIGN

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Obtain values outside the program and assign them to a Working-Storage data area in the current program.

Syntax:
CIC-ASSIGN CICSoption(dataarea) [CICSoption(dataarea)....]
... [ERROR(errorpara)]
 
Parameters:

option

Valid CICS option. See your CICS reference manual for more information.

(dataarea)

COBOL data name containing the result of the call.

(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

Example:

Obtain a value outside the application program and assign it to a user-defined area.

CIC-ASSIGN APPLID(WS-APPLID)
... ERROR(ERROR-PARA)

CIC-CANCEL

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Cancel a previously issued CIC-DELAY (See CIC-DELAY) or CIC-START (See CIC-START).

Syntax:
CIC-CANCEL [REQID(name)]
... [TRANSID(name)]
... [SYSID(name)]
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

REQID(name)

Unique call name; can be a literal or COBOL data name (maximum 8 characters).

SYSID(name)

Remote system name; can be a literal or a COBOL data name (maximum 4 characters).

TRANSID(name)

Transaction code identifying the program where control returns; can be a literal (maximum 4 characters) or COBOL data name (minimum 5 characters).

Example:

Cancel an activity invoked by a CIC-START.

CIC-CANCEL TRANSID('TRAN') ERROR(ERROR-PARA)

CIC-DELAY

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Suspend task processing for a prescribed time interval.

Syntax:
CIC-DELAY [ REQID(name)]
... [INTERVAL(hhmmss)|TIME(hhmmss)]
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

INTERVAL(hhmmss)

Time interval between issuing and executing a call. Hhmmss can be replaced by zero, a decimal constant, or a COBOL data name defined as PIC S9(07) COMP-3.

REQID(name)

Unique call name; can be a literal or COBOL data name (maximum 8 characters).

TIME(hhmmss)

Expiration time for the DELAY function. Hhmmss can be replaced by a decimal constant or a COBOL data name defined as PIC S9(07) COMP-3.

Examples:

Suspend task processing for a 5-minute interval; let another task cancel this activity (UNIQCOM command).

CIC-DELAY INTERVAL(500) ERROR(ERROR-PARA) REQID('UNIQCOM')

Suspend task processing until 1:30 a.m.

CIC-DELAY TIME(013000) ERROR(ERROR-PARA) REQID('UNIQCOM')

CIC-DELETEQ-TD

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Delete all transient data associated with a predefined transient data queue.

Syntax:
CIC-DELETEQ-TD QUEUE(name)
... [SYSID(name)]
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

QUEUE(name)

Queue name; can be a literal (maximum 8 characters), or COBOL data name (maximum 30 characters) defined as X(4).

SYSID(name)

Remote system name; can be a literal or a COBOL data name (maximum 4 characters).

Example:

Delete all the intrapartition transient data stored in storage queue 'TDAQ'.

CIC-DELETEQ-TD QUEUE('TDAQ') ERROR(ERROR-PARA)

CIC-DELETEQ-TS

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Delete all temporary data and free all storage associated with a temporary storage queue.

Syntax:
CIC-DELETEQ-TS QUEUE(name)
... [SYSID(name)]
... [ERROR(erropara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

QUEUE(name)

Queue name; can be a literal (maximum 8 characters), or COBOL data name (maximum 30 characters) defined as X(4).

SYSID(name)

Remote system name; can be a literal or a COBOL data name (maximum 4 characters).

Example:

Delete all the data stored in temporary storage queue 'TSAQ'.

CIC-DELETEQ-TS QUEUE('TSAQ') ERROR(ERROR-PARA)

CIC-FREEMAIN

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Release storage previously acquired by a CIC-GETMAIN (See CIC-GETMAIN).

Syntax:
CIC-FREEMAIN DATA(linkdataname)
Parameters:

linkdataname

01-level Linkage Section data area identical to the linkdataname in the associated TP-LINKAGE call.

Example:

Release the main storage of LK-STORAGE-AREA.

CIC-FREEMAIN DATA(LK-STORAGE-AREA)

CIC-GETMAIN

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Obtain and initialize main storage. To release storage, see CIC-FREEMAIN.

Syntax:
CIC-GETMAIN SET(linkdataname)
... LENGTH(value)|FLENGTH(value)
... [INITIMG(value)]
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

INITIMG(value)

Initialize storage area. Value is 1 byte; can be a literal or COBOL data name.

FLENGTH(value)

Applies to the z/OS target only.
Specify length as a full word value.

LENGTH(value)

Maximum length of data; can be a literal (LINK or XCTL only) or COBOL data name defined as S9(04)COMP. Can also be a partial length (XCTL only).

SET(linkdataname)

01-level Linkage Section data area identical to the linkdataname in the associated TP-LINKAGE call.

Example:

Obtain an area of main storage of the length specified in the Working-Storage data area (WS-LENGTH). Specify initialization value (WS-BLANK) for the acquired main storage.

CIC-GETMAIN SET(STORAGE-AREA)
... LENGTH(WS-LENGTH)
... INITIMG(WS-BLANK)
... ERROR(ERROR-PARA)

CIC-LOAD

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Load specified programs, tables, or maps from a library to main storage; to delete these, see CIC-RELEASE.

Syntax:
CIC-LOAD PROGRAM(name) [SET(linkdataname)]
... [LENGTH(dataarea)]|[FLENGTH(dataarea)]
... [ENTRY(pointref)]
... [HOLD] [ERROR(errorpara)]
Parameters:

ENTRY(pointref)

BBL cell containing program address after the LOAD operation.

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

FLENGTH(value)

Applies to the z/OS target only. Specify length as a full word value.

HOLD

Hold loaded module in main storage until a CIC-RELEASE call executes.

LENGTH(value)

Maximum length of data; can be a literal (LINK or XCTL only) or COBOL data name defined as S9(04)COMP. Can also be a partial length (XCTL only).

PROGRAM(name)

Name of module to load into main storage; can be a literal or COBOL data name (maximum 8 characters).

SET(linkdataname)

01-level Linkage Section data area identical to the linkdataname in the associated TP-LINKAGE call.

Example:

Load table TAXTAB into main storage; perform user-defined error routine ERROR-PARA when an error occurs; store the address at which the module was loaded in Linkage Section data area TAX-TABLE-AREA; and store the length of the loaded module in Working-Storage data area TAX-LEN.

CIC-LOAD PROGRAM('TAXTAB')
... SET(TAX-TABLE-AREA) LENGTH(TAX-LEN)
... ERROR(ERROR-PARA)

CIC-READQ-TD

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Read transient data from a predefined data queue.

Syntax:
CIC-READQ-TD QUEUE(name)
... INTO(dataarea)|SET(linkdataname)
... [LENGTH(dataarea)] [SYSID(name)]
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

INTO(dataarea)

Name of data area where APS places transient or temporary data.

LENGTH(value)

Maximum length of data; can be a literal (LINK or XCTL only) or COBOL data name defined as S9(04)COMP. Can also be a partial length (XCTL only).

QUEUE(name)

Queue name; can be a literal (maximum 8 characters), or COBOL data name (maximum 30 characters) defined as X(4).

SET(linkdataname)

01-level Linkage Section data area identical to the linkdataname in the associated TP-LINKAGE call.

SYSID(name)

Applies to the z/OS target only. Remote system name; can be a literal or a COBOL data name (maximum 4 characters).

Example:

Read a record from a transient data queue `TDAQ' into data area WS-TD-REC.

CIC-READQ-TD QUEUE('TDAQ') INTO(WS-TD-REC)
... LENGTH(WS-TD-LEN)
... ERROR(ERROR-PARA)

CIC-READQ-TS

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Retrieve data from a temporary storage queue in main or auxiliary storage.

Syntax:
CIC-READQ-TS QUEUE(name)
... INTO(dataarea)|SET(linkdataname)
... LENGTH(dataarea) NUMITEMS(dataarea)
... [ITEM(value)|next]
... [SYSID(name)]
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

INTO(dataarea)

Name of data area where APS places transient or temporary data.

ITEM(value)

Relative record number in the queue; can be a literal or COBOL data name defined as S9(04)COMP. Required with REWRITE.

LENGTH(value)

Maximum length of data; can be a literal (LINK or XCTL only) or COBOL data name defined as S9(04)COMP. Can also be a partial length (XCTL only).

NEXT

Read next sequential logical record.

NUMITEMS(dataarea)

Applies to the z/OS target only.
Number of items in the queue.

QUEUE(name)

Queue name; can be a literal (maximum 8 characters), or COBOL data name (maximum 30 characters) defined as X(4).

SET(linkdataname)

01-level Linkage Section data area identical to the linkdataname in the associated TP-LINKAGE call.

SYSID(name)

Applies to the z/OS target only. Remote system name; can be a literal or a COBOL data name (maximum 4 characters).

Example:

Read the next (or only) record from temporary storage queue `TSAQ' into data area WS-TD-RECORD.

CIC-READQ-TS QUEUE('TSAQ')
... INTO(WS-TD-RECORD) LENGTH(WS-TD-RECLEN)
... ERROR(ERROR-PARA)

CIC-RELEASE

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target in the z/OS environment

Description:

Delete program, table, or map, previously loaded with a CIC-LOAD call (See CIC-LOAD), from main storage.

Syntax:
CIC-RELEASE PROGRAM(name)
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs

PROGRAM(name)

Main storage module to be deleted; can be a literal or COBOL data name (maximum 8 characters)

Example:

Delete program PROG5.

CIC-RELEASE PROGRAM('PROG5')
... ERROR(ERROR-PARA)

CICS

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS targets

Description:

Code and pass through native CICS calls.

Syntax:
CICS command
Example:

Retrieve the system time of day.

CICS ASKTIME

CIC-SCHEDULE-PSB

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS and IMS DB targets

Description:

Schedule the PSB in the program, if not currently scheduled; to terminate it, see CIC-TERM-PSB. APS automatically generates these calls when you specify a PSB in the Application Painter.

Syntax:
CIC-SCHEDULE-PSB
Comment:

To define a PSB in your application definition, see the APS User's Guide chapter Paint the Application Definition.


CIC-SEND-TEXT

Category

Data communication call (see Data Communication Calls)

Compatibility

CICS target

Description:

Format output data without mapping and transmit to a terminal or line printer.

Syntax:
CIC-SEND-TEXT FROM(dataarea)
... LENGTH(value) [CICSoptions]
... [ERROR(errorpara)]
Parameters:

CICSoptions

Valid CICS option. See your CICS reference manual for more information.

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

FROM(dataarea)

Data area to be acted on.

LENGTH(value)

Maximum length of data; can be a literal (LINK or XCTL only) or COBOL data name defined as S9(04)COMP; can also be a partial length (XCTL only).

Comment:

Use CIC-SEND-TEXT prior to a TERM (See TERM) from a main program in order to clear the screen and unlock the keyboard.

Example:

CIC-SEND-TEXT outputs data block TEXT-STRING, to be formatted without being mapped.

CIC-SEND-TEXT FROM(TEXT-STRING)
... LENGTH(100) ERASE FREEKB
... ERROR(ERROR-PARA)

CIC-SERVICE-RELOAD

Category

Data communication call (see Data Communication Calls)

Compatibility

CICS target

Description:

Establish addressability to a data area in the Linkage Section following an address change in the BLL cell.

Syntax:
CIC-SERVICE-RELOAD linkdataname
Parameters:

linkdataname

01-level Linkage Section data area identical to the linkdataname in the associated TP-LINKAGE call.

Comment:

SERVICE-RELOAD is an OS/VS COBOL statement; do not use with COBOL II, because the compiler treats this call as a CONTINUE statement.

Example:

Establish addressability to Linkage area LINK-AREA-1 after an address change.

MOVE PASSED-ADDRESS TO LINK-AREA-1-PNTR
CIC-SERVICE-RELOAD LINK-AREA-1

CIC-START

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Start a task on a local or remote system at a specified time.

Syntax:
CIC-START TRANSID(name)
... [INTERVAL(hhmmss)|TIME(hhmmss)] [CICSoptions]
... [ERROR(errorpara)]
Parameters:

CICSoptions

Valid CICS option. See your CICS reference manual for more information.

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

INTERVAL(hhmmss)

Time interval between issuing and executing the call. Hhmmss can be replaced by zero, a decimal constant, or a COBOL data name defined as PIC S9(07) COMP-3.

TIME(hhmmss)

Expiration time for the START function. Hhmmss can be replaced by a decimal constant or a COBOL data name defined as PIC S9(07) COMP-3.

TRANSID(name)

Transaction code identifying the program where control returns; can be a literal (maximum 4 characters) or COBOL data name (minimum 5 characters).

Examples:

Start a specific task (not associated with a terminal) in one hour.

CIC-START TRANSID('TRNL') INTERVAL(10000)
... ERROR(ERROR-PARA)

Initiate task TRN2 associated with terminal STA3; begin the task at 5:30 P.M.

CIC-START TRANSID('TRN2') TIME(173000)
... TERMID('STA3') ERROR(ERROR-PARA)

CIC-TERM-PSB

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Terminate the currently scheduled PSB (See CIC-SCHEDULE-PSB). You normally use this call before transferring to another program.

Syntax:
CIC-TERM-PSB

CIC-WRITEQ-TD

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Write transient data to a predefined data queue.

Syntax:
CIC-WRITEQ-TD QUEUE(name) FROM(dataarea)
... [LENGTH(value)] [SYSID(name)]
... [ERROR(errorpara)]
Parameters:

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

FROM(dataarea)

Data area to be acted on.

LENGTH(value)

Maximum length of data; can be a literal (LINK or XCTL only) or COBOL data name defined as S9(04)COMP. Can also be a partial length (XCTL only). Required with SYSID.

QUEUE(name)

Queue name; can be a literal (maximum 8 characters), or COBOL data name (maximum 30 characters) defined as X(4).

SYSID(name)

Remote system name; can be a literal or a COBOL data name (maximum 4 characters).

Example:

Write data to predefined transient data queue 'TRDQ'.

CIC-WRITEQ-TD QUEUE('TRDQ') FROM(WS-MESSAGE)
... LENGTH(WS-TD-LEN)
... ERROR(ERROR-PARA)

CIC-WRITEQ-TS

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS target

Description:

Write or rewrite temporary data records to a temporary storage queue.

Syntax:
CIC-WRITEQ-TS QUEUE(name) FROM(dataarea)
... LENGTH(value) [SYSID(name)]
... [ITEM(dataarea) [REWRITE] [CICSoptions]
... [NOSUSPEND]
... [ERROR(errorpara)]
Parameters:

CICSoptions

Valid CICS option. See your CICS reference manual for more information.

ERROR(errorpara)

User-defined error routine to perform when an abnormal condition occurs.

FROM(dataarea)

Data area to be acted on.

ITEM(value)

Relative record number in the queue; can be a literal or COBOL data name defined as S9(04)COMP. Required with REWRITE.

LENGTH(value)

Maximum length of data; can be a literal (LINK or XCTL only) or COBOL data name defined as S9(04)COMP. Can also be a partial length (XCTL only).

NOSUSPEND

Return to the program without waiting for resources to become available.

QUEUE(name)

Queue name; can be a literal (maximum 8 characters), or COBOL data name (maximum 30 characters) defined as X(4).

REWRITE

Overwrite existing record in queue with data contained in data area.

SYSID(name)

Remote system name; can be a literal or a COBOL data name (maximum 4 characters).

Example:

Write a record to a temporary storage queue in auxiliary storage, where the queue name is in QUEUE-NAME.

CIC-WRITE-TS QUEUE(QUEUE-NAME)
... FROM(WS-TS-RECORD)
... LENGTH(WS-TS-LENGTH)
... ITEM(WS-TS-ITEM-NO)
... ERROR(ERROR-PARA)

CLEAR

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS, IMS DC, and ISPF Dialog targets

Description:

Move spaces or low-values to all fields in a specified screen.

Syntax:
[TP-|SC-]CLEAR screenname
Comment:

This call does not alter the field attributes.

Example:

Move spaces to all fields on screen SCRA.

CLEAR SCRA

CLEAR-ATTRS

Category:

Data communication call (see Data Communication Calls)

Compatibility:

CICS, IMS DC, and ISPF Dialog targets

Description:

Reset all screen field attributes to their original painted values.

Syntax:
[TP-]CLEAR-ATTRS screenname
Comment:

The screen field contents do not change.

Example:

Reset all field attributes to their original values for screen SCRA.

CLEAR-ATTRS SCRA

COBOL/2 Support

Description:

Code program logic in both the Program Painter and Specification Editor using COBOL/2 structures.

Under APS COBOL/2 support, you can:

You can turn COBOL/2 support on and off by setting the Generate COBOL/2 field on the Generation Options screen.

When programming in the Program Painter or Specification Editor, you can code in COBOL/2 as follows.

Comments:


CODE

Category:

Report Writer clause (see Report Writer Structures and the APS User's Guide chapter Create Reports with Report Writer)

Compatibility:

Batch environments

Description:

Specify a two-character literal placed at the beginning of each report line. It is useful when writing multiple reports to one file.

Syntax:
CODE literal
Parameters:

literal

A two-character, non-numeric name inserted as the first two bytes of each report record or print line

Comments:

Example:

See the APS User's Guide chapter Create Reports with Report Writer.


Comments

Description:

Enter comments in your program. To write comments in the Identification Division, see REM.

Syntax:

Comments:

Examples:

In the Program Painter:

-LINE- -KYWD-  12--*--20---*----30----*---40---*----50---*----60
002000         /* S-COBOL COMMENT LINE
002010  /*     COBOL COMMENT LINE
002020  PARA   MAIN-PARA   /* S-COBOL COMMENT

 

In the Data Structure Painter:

-LINE- -------- DATA STRUCTURE PAINTER -------
000001         /* WORK FIELD 1 RECORD
000002         WRK1-FIELD-1    X(5)
000003             88 OPEN-VAL   V'OPEN'
000004             88 CLOSED-VAL V'CLOSE'

Generated COBOL code:

000001  */* WORK FIELD 1 RECORD
000002   01  WRK1-FIELD-1    PIC X(5).
000003       88  OPEN-VAL    VALUE 'OPEN'.
000004       88  CLOSED-VAL  VALUE 'CLOSE'.

Component List (MS01)

Category:

APS-generated report (see Application Reports)

Description:

The Component List Report catalogs all of the components created for an application within a specific Project andGroup.

The report lists components by painter in six columns - one each for applications, programs, screens, report mock-ups, data structures, and scenarios. Within each column, the report lists components in alphabetical order. The bottom of the report totals the number of components listed for each painter. You can produce a report listing application components of one or more types.

Comments:

Example:

 

REPORT CODE: MS01                APS APPLICATION DICTIONARY                   PAGE     1
                                 COMPONENT LIST                           05/17/92 09:13
                                 MKTAPS.MKT2
SELECTION CRITERIA: ALL
*********************************************************************************************

APPLICATIONS  PROGRAMS SCREENS   REPORTS   DATA STRUCTURES SCENARIOS
------------  -------- -------   -------   --------------- ---------

CICSJSS       ADEMO    ADEMO     $APSCMR   APCOMM          APDEMO
CICSVSAM      AW02PGM  ADEMOKB   MANUFAC   AWO3            APSDEMO
CUSTORDR      AW03PGM  ADEMO1    MWPART    BANK2           APSDEMO2
DEMOKEB       XXXPGM   ADEMO1J   REPORT1   COMAREA2        APSDEMO3
DEMO1803      ANNER1   ADEMO1X   VNDROPD   DLGAPPL         DEMO4
DLXVAPPL      DLGINQ   ADEMO3D             CPFDATAB        CBIS
DLX2APPL      LGMNU    ADEMO3J             DB2DEMO         DL2APPL
DMVAPPL       DLXVINQ  A2CASE              MARIA           DEMO###
LEVEL30       DLX2UPD  CMKTEMP             QSSGLOBL        ISR00007
MVS20SCR      DMOMNU   CMK1                QSS9            MVS21
PTSUNLD       PMINFOT1 DLGU                                SSS2
PXAPPL        PMINFOT2 DMOM                                TEST
QSSAPPL       PMINFO3  KEB
SSKTEST       PMINFO4  KEBDEMO1
TDDEMO        PMUDS1   KEB1
TESTQSS       PMXXXXT2 MEAD1
USRDEMO       PMXXXXT3 P22604
              PM1SVKEY REWDEMO
              PTSUNLD  TDCS
                       PXCUSTM   TDDDH
                       PXMENU    TDDST
                       PXORDRM   TDFIRN
                       PXORDRS   TDJH
                       PXPARTL   TDME
                       PXVCUSTM  TDOJ
                       PXVMENU   TDOM
                       PXVORDRM  TDOT
                       PXVORDRS  TDOU
                       PXVPARTL  TDPF
.
.
                       TDCM
                       TDCS
                       TDME
                       TDOJ
                       TDOM
                       TDOT
                       TDOU
                       TDPF
                       TDPL
                       TDPM

      APPLICATIONS  -     28
          PROGRAMS  -     60
           SCREENS  -     50
           REPORTS  -      6
   DATA STRUCTURES  -     13
         SCENARIOS  -     18

CONTROL

Category:

Report Writer clause (see Report Writer Structures and the APS User's Guide chapter Create Reports with Report Writer)

Compatibility:

Batch environments

Description:

Identify control data items (controls), which are tested for a change each time a detail line is printed. Create a control hierarchy for the report control headings and footings (control breaks).

Syntax:

Parameters:

dataname

Data item that causes a control break when it changes.

FINAL

Inclusive report control group not associated with a control dataname. It represents the highest level of control.

Comments:

Example:

See the APS User's Guide chapter Create Reports with Report Writer.


Control Files

Description:

Use APS control file variables to control certain functions. Each control file contains documentation on its variables. Look in the APS CNTL PDS or library for these files.

APS CNTL File

Environment or Function Controlled

APCICSIN

CICS

APSDBDC

Database and data communication calls

APFEIN

Field edits

APDLGIN

ISPF Dialog

APIMSIN

IMS DB and DC

APDB2IN

SQL

APVSAMIN

VSAM

APHLPIN

User Help Facility database

CICS

File APCICSIN controls:

DB and DC Calls

Note: Changing APSDBDC file parameter values affects the entire installation. To override values only for a specific Project, set the variables in the CNTL file APSPROJ.


Parameter
Description

% SET NOBLANK

Suppress blank lines from appearing in the output. Override with % SET BLANK.

% SET EVAL-BRACKETS "<>"

Define the characters used as evaluation brackets.

Important: Overriding this parameter is not recommended because it will affect the Customization Facility macros.

% SET LOOP-LIMIT 500

Limit the APSMACS (APS macros) and USERMACS (user macros) Customization Facility loop structures to a maximum of 500 loops. Override with another number, 6 digits maximum.


Note: Loop limit flags for DB-PROCESS loops are in the target-specific APS CNTL files.


% &MACRO-COMMENTS = 1 and % &TP-MACRO-COMMENTS = 1

Allows COBOL comments to appear in generated source. Override with 0.

% SET TRACE ERROR

Customization Facility parameter. An error trace mechanism that identifies the line of source that caused the error, the active % INCLUDE statement(s), the macro(s) currently invoked and not yet ended, and the number of loops completed at the time of error (if applicable). The severity codes of errors traced are F (Fatal), E (Error), W (Warning), and I (Information) messages. To eliminate Information message traces, append a space and the keyword NOINFO to the trace statement. To turn off the trace in selected portions of a program, code % SET NOTRACE.

% &IM-HOLD-DEFAULT = "NOHOLD"

Prevent APS-generated IMS DB-OBTAIN calls from HOLDing a record for update except when HOLD is specified in the DB-OBTAIN call. Override with "procopt", which does HOLD a record automatically, assuming the subschema or PSB specifies that the program can update the record.

% &VS-PROTOTYPE-MODE = "NO"

"Yes" specifies that a VSAM program is a prototype, enabling you to code DB calls without accessing a VSAM file. All subschema validation at program generation is still performed. NO means prototype mode is inactive.

% &IM-SUPPRESS-DB-CALL = "NO"

Deactivate the prototype mode for an IMS program. "Yes" specifies that an IMS program is a prototype, enabling you to code DB calls without accessing a data base. All subschema validation at program generation is still performed.

% &IM-USE-DFS0AER = 0

Disable the APS-supplied IMS database error routine macros from calling the IMS-supplied error display module, DFS0AER. All database errors are resolved using only the APS-supplied status flags. To enable use of DSF0AER and the APS-supplied flags, set to 1. If your installation does not use DFS0AER, leave this flag set to 0. See Error Handling.

% &GEN-DB-REC-01-NAMES = 0

IMS DB parameter. If your top-level copylib records begin with the level number 01 positioned in column 8, use the flag default of 0. If they don't, override with 1. When writing DDI statements for copylibs that don't begin with 01-level records, see instructions in the topic "Writing DDI Statements for IMS" in the APS User's Guide.


Note: For VSAM, an equivalent flag exists in the APS CNTL file APVSAMIN.


% &IM-SUPPRESS-COPYLIB = 0 and % &VS-SUPPRESS-COPYLIB = 0

Override with 1 to suppress a copylib described in your DDI statements. &IM is for IMS; &VS is for VSAM.

% &IM-USE-ASSEMBLER-BLOCKING = 1

Use a supplied Assembler routine to move data between record I/O areas and IMS concatenated segment I/O areas in APS-generated programs. This method is recommended because it's more efficient and doesn't require redefining the record I/O areas.


Note: Because this module is linked during generation of COBOL code, setting this variable to 1 might interfere with transportablilty of the generated code.


Overriding with 0 causes APS-generated programs to block and unblock IMS concatenated I/O areas using a byte-level loop in the generated code. Setting to 0 also causes APS to automatically redefine all record I/O areas as an array of bytes Note: Setting to 0 is incompatible with copylib members containing a COBOL OCCURS DEPENDING ON clause or multiple record declarations in a single member.

% &COPY-SECTION = "WORKING-STORAGE"

Specifies that copylib members are placed in Working-Storage.

% &TP-RETRY = 1

Set the parameter RETRY as the default parameter for the NTRY call. Override with 0 to set the default to NORETRY. You can also override on a program-by-program basis by coding RETRY or NORETRY in the NTRY call. See NTRY for more information.

% &IM-EXEC-DLI = 0

Generate CALL 'CBLTDLI' syntax. Override with 1 to generate EXEC DL/I syntax.

% &DBCS = 0

Set to 1, the Double Byte Character Set flag, for KANJI support.

Field Edits

File APFEIN controls:

IMS DB and DC

Use the IMS control file, APIMSIN, to control these functions:

ISPF Dialog

Use the ISPF Dialog contol file, APDLGIN, to control these functions:

SQL

Use the DB2 control file, APDB2IN, to control these functions:

VSAM Batch and Online

Use the VSAM control file, APVSAMIN, to control these functions:

User Help

Use the APS User Help Facility control file, APHLPIN, to control these functions for generating the User Help database:


Control Points

Category:

Online Express feature

Description:

Write and execute custom processing logic to supplement or override the default logic that Online Express generates. Execute this logic at any of the APS-provided locations in your program, known as program control points.

To view the control points in your program, display the Control Points screen or the Database Call Tailoring screen. Or, you can look in your generated program source to see where the control points occur. The complete set of control points is as follows.

Control Point
Location in Program

After-Receive-Para

After entering a program, regardless of invocation mode.

Post-Screen-Read

After a screen-invoked program receives its screen.

Transid-Invoked-Para

After a transid-invoked program is invoked.

Program-Invoked-Para

When APS displays the screen of a program invoked by the XCTL or MSG-SW function.

Pre-Term

Before APS terminates the program.

After-Enter-Check

After the end user presses the processing key (the Enter key is the default), and before the PRE-FUNCTION-TEST paragraph executes.

Pre-Function-Test

Before APS evaluates all functions except the Terminate, or Exit, function.

Pre-Branch

Before each MSG-SW, XCTL, or Call function executes.

Ed-Error-Pre-Send

Before APS send a screen whose field edits have failed.

General-Pre-Send

After APS checks all functions, and before the TP-SEND call executes, when invocation mode is screen-invoked.

Before-Send-Para

Before APS sends the screen, regardless of invocation mode.

Pre-Screen-To-Rec

Before APS performs the MOVE-SCREEN-TO-REC paragraph.

Post-Screen-To-Rec

After APS performs the MOVE-SCREEN-TO-REC paragraph, and the Update or Add function executes.

Pre-Rec-To-Screen

Before APS performs the MOVE-REC-TO-SCREEN paragraph.

Post-Rec-To-Screen

After APS performs the MOVE-REC-TO-SCREEN paragraph, and after the Query function executes.

Pre-RB1-Row-To-Rec

Before the Add or Update function executes for a repeated record block row, and before screen fields move to database fields. APS uses the subscript CTR to reference repeated block rows.

Post-RB1-Row-To-Rec

Before the Add or Update function executes for a repeated record block row, and after screen fields move to database fields. APS uses the subscript CTR to reference repeated block rows.

Pre-Rec-To-RB1-Row

After the Query or Forward function executes for a repeated record block row, and before database fields move to screen fields. APS uses the subscript CTR to reference repeated block rows.

Post-Rec-To-RB1-Row

After the Query or Forward function executes for a repeated record block row, and after database fields move to screen fields. APS uses the subscipt CTR to reference repeated block rows.

Error-Send-And-Quit

When a program terminates abnormally, such as when a database call fails when the Database Call Tailoring screen's Abort On Error parameter is set to Y.

Misc-User-Paragraphs

A location where you can write and store any number of paragraphs to perform at any control point in the program. Code all your paragraphs in one file in this location.

Before DB Access

Before a non-loop database call executes

Before Loop

Before a loop database call executes

Normal Status (Before Record is Processed)

Before Online Express maps looped records to the screen

Normal Status

After Online Express maps any records to the screen

Exception Status

After the database call returns a status flag with the Exception status code

Error Status

After the database call returns a status flag with the Error status code

After DB Access

After a non-loop database call executes

After Loop

After a loop database call executes

Flowcharts

The following flowcharts illustrate the locations of all control points in APS-generated programs.

The flowchart below illustrates the location of the database call control points in generated programs.

Comments:

Example:

Map records that show annual sales of $100,000 or more in the Northwest region, and calculate and map the grand total of those records. First define a loop call and qualify it to obtain the records of $100,000 or more. Then tailor the loop call with two local stubs. The first stub checks the records obtained by the loop to allow only records of the Northwest region to be processed further. The second stub calculates the grand total of those records, and maps the total to the screen.

DB-PROCESS REC SALES-RECORD
... WHERE ANNUAL-SALES-TOTAL > 99999
    PERFORM CHECK-BEFORE-MAPPING-STUB-PARA
    IF OK-TO-PROCEED
        ADD 1 TO CTR
        PERFORM RECORD-STOREKEY-PARA
        MOVE REC-TO-SCREEN-BLK1
        PERFORM CHECK-AFTER-MAPPING-STUB-PARA
   .
   .
   .
CHECK-BEFORE-MAPPING-PARA
    TRUE OK-TO-PROCEED
    IF SALES-REGION NOT = NORTHWEST
        FALSE OK-TO-PROCEED
CHECK-AFTER-MAPPING-PARA
    calculation and mapping routine for grand total

Note:


Copyright © 2001 Micro Focus International Limited. All rights reserved.
This document and the proprietary marks and names used herein are protected by international law.



Copyright © 2002 Micro Focus International Limited. All rights reserved.
This document and the proprietary marks and names used herein are protected by international law.