User Tools

Site Tools


project:cobol:start

Differences

This shows you the differences between two versions of the page.

Link to this comparison view

Both sides previous revisionPrevious revision
Next revision
Previous revision
Last revisionBoth sides next revision
project:cobol:start [2016/11/27 04:31] ruzaproject:cobol:start [2018/05/04 08:02] ruza
Line 6: Line 6:
 ~~META: ~~META:
 status = active status = active
 +&relation firstimage = :project:cobol_report_apr60.jpg
 ~~ ~~
  
Line 21: Line 22:
  
  
-Example in ILE COBOL and call FUNCTION API which return current date.+Example in ILE COBOL and call FUNCTION API which return the current date.
 <code cobol> <code cobol>
-    01 WS-CURRENT-DATE-DATA.  +    01 WS-CURRENT-DATE-DATA.  
-       05 WS-CURRENT-DATE.  +       05 WS-CURRENT-DATE.  
-          10 WS-CURRENT-YEAR         PIC 9(04).  +          10 WS-CURRENT-YEAR         PIC 9(04).  
-          10 WS-CURRENT-MONTH        PIC 9(02).  +          10 WS-CURRENT-MONTH        PIC 9(02).  
-          10 WS-CURRENT-DAY          PIC 9(02).  +          10 WS-CURRENT-DAY          PIC 9(02).  
-       05 WS-CURRENT-TIME. +       05 WS-CURRENT-TIME. 
           10 WS-CURRENT-HOURS        PIC 9(02). ​           10 WS-CURRENT-HOURS        PIC 9(02). ​
           10 WS-CURRENT-MINUTE       PIC 9(02). ​           10 WS-CURRENT-MINUTE       PIC 9(02). ​
Line 40: Line 41:
 </code> </code>
  
-This is example code with call AS400 API for dump memmory in ILE COBOL.+This is example code with call AS400 API for dump memory in ILE COBOL.
 <code cobol> <code cobol>
        PROCESS OPTIONS NOMONOPRC NOSTDTRUNC.                                            PROCESS OPTIONS NOMONOPRC NOSTDTRUNC.                                    
Line 119: Line 120:
 ====== OpenCOBOL (GNUCOBOL) ====== ====== OpenCOBOL (GNUCOBOL) ======
 Open source variant and crossplatform cobol for PC. Open source variant and crossplatform cobol for PC.
-This is example in OpenCOBOL on PC. Program shows date and time.+This is an example in OpenCOBOL on PC. Program shows date and time.
 <code cobol> <code cobol>
       ******************************************************************       ******************************************************************
Line 167: Line 168:
 ====== More Examples ====== ====== More Examples ======
 More code examples for [[https://github.com/Martinfx/Cobol]] More code examples for [[https://github.com/Martinfx/Cobol]]
 +
 +Slides from our actions [[https://brmlab.cz/event/as400clcobol]]