products/Sources/formale Sprachen/COBOL/verschiedene-Autoren/Cobug image not shown  

Quellcode-Bibliothek

© Kompilation durch diese Firma

[Weder Korrektheit noch Funktionsfähigkeit der Software werden zugesichert.]

Datei: ical.xml   Sprache: Cobol

Untersuchung verschiedene©

* Subject: ACCEPT -BAD WORK
* Message from r_jaro 7/30/2008
* HI 
* This is my structure data
ID DIVISION.
PROGRAM-ID.  BadWork.
ENVIRONMENT DIVISION.
CONFIGURATION SECTION.
SOURCE-COMPUTER.  xyz.
OBJECT-COMPUTER.  xyz.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 CUSTOMER-DETAILS. 
02 ID-CUSTOMER PIC 9(3). 
02 CUSTOMER-NAME. 
03 LAST-NAME PIC X(20). 
03 FIRST-NAME PIC X(20). 
02 ADDRESS-1. 
03 TOWN PIC X(20). 
03 STREET PIC X(20). 
03 NUMBER-HOUSE PIC 9(3). 
02 NIP PIC X(13). 
*and i try initialize this record
procedure division.
INIT-CUSTOMER-RECORD. 
MOVE SPACE TO CUSTOMER-DETAILS. 
MOVE ZEROES TO ID-CUSTOMER. 
MOVE ZEROES TO NUMBER-HOUSE. 
ENTER-CUSTOMER-RECORD. 
DISPLAY "ENTER ID-CUSTOMER (001-999)"
ACCEPT ID-CUSTOMER. 
DISPLAY "ENTER LAST NAME"
ACCEPT LAST-NAME. 
DISPLAY "ENTER FIRST-NAME"
ACCEPT FIRST-NAME. 
DISPLAY "ENTER TOWN"
ACCEPT TOWN 
DISPLAY "ENTER STREET"
ACCEPT STREET. 
DISPLAY "ENTER NUMBER HOUSE (001 - 999)"
ACCEPT NUMBER-HOUSE. 
DISPLAY "ENTER NIP"
ACCEPT NIP. 
*When i run program and enter number - is ok 
*but next field length 30 charset 
*and i enter example: 
*Johnny [enter
*and i dont see next DISPLAY FIELD because 
*len(johnny) = 6 and my field is 30 letter. 
*I dont no how i can enter next field-record. 
*When i enter 30 letter then every thing is ok. 

¤ Diese beiden folgenden Angebotsgruppen bietet das Unternehmen0.31Angebot  Wie Sie bei der Firma Beratungs- und Dienstleistungen beauftragen können  ¤





Druckansicht
unsichere Verbindung
Druckansicht
Hier finden Sie eine Liste der Produkte des Unternehmens

Mittel




Lebenszyklus

Die hierunter aufgelisteten Ziele sind für diese Firma wichtig


Ziele

Entwicklung einer Software für die statische Quellcodeanalyse


Bot Zugriff