hexsha
stringlengths 40
40
| size
int64 11
739k
| ext
stringclasses 5
values | lang
stringclasses 1
value | max_stars_repo_path
stringlengths 5
137
| max_stars_repo_name
stringclasses 556
values | max_stars_repo_head_hexsha
stringclasses 556
values | max_stars_repo_licenses
sequencelengths 1
4
| max_stars_count
int64 1
16.6k
⌀ | max_stars_repo_stars_event_min_datetime
stringclasses 272
values | max_stars_repo_stars_event_max_datetime
stringclasses 272
values | max_issues_repo_path
stringlengths 5
137
| max_issues_repo_name
stringclasses 557
values | max_issues_repo_head_hexsha
stringclasses 557
values | max_issues_repo_licenses
sequencelengths 1
4
| max_issues_count
int64 1
3.68k
⌀ | max_issues_repo_issues_event_min_datetime
stringclasses 158
values | max_issues_repo_issues_event_max_datetime
stringclasses 158
values | max_forks_repo_path
stringlengths 5
137
| max_forks_repo_name
stringclasses 557
values | max_forks_repo_head_hexsha
stringclasses 557
values | max_forks_repo_licenses
sequencelengths 1
4
| max_forks_count
int64 1
4.07k
⌀ | max_forks_repo_forks_event_min_datetime
stringclasses 207
values | max_forks_repo_forks_event_max_datetime
stringclasses 207
values | content
stringlengths 11
739k
| avg_line_length
float64 4.67
9.43k
| max_line_length
int64 8
376k
| alphanum_fraction
float64 0
0.89
|
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
c7b15a98414740a41ed81e6a7a3116f6ec737ecb | 612 | cbl | COBOL | src/cross.cbl | gyng/COBOL-CASTER | 652c56dea9d050afa11f57793d255bf5487ae881 | [
"MIT"
] | null | null | null | src/cross.cbl | gyng/COBOL-CASTER | 652c56dea9d050afa11f57793d255bf5487ae881 | [
"MIT"
] | null | null | null | src/cross.cbl | gyng/COBOL-CASTER | 652c56dea9d050afa11f57793d255bf5487ae881 | [
"MIT"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. VCROSS.
DATA DIVISION.
LINKAGE SECTION.
01 v1x PIC S9(8)V9(2).
01 v1y PIC S9(8)V9(2).
01 v1z PIC S9(8)V9(2).
01 v2x PIC S9(8)V9(2).
01 v2y PIC S9(8)V9(2).
01 v2z PIC S9(8)V9(2).
01 retx PIC S9(8)V9(2).
01 rety PIC S9(8)V9(2).
01 retz PIC S9(8)V9(2).
PROCEDURE DIVISION USING v1x, v1y, v1z, v2x, v2y, v2z, retx, rety, retz.
COMPUTE retx = (v1y * v2z) - (v1z * v2y).
COMPUTE rety = (v1z * v2x) - (v1x * v2z).
COMPUTE retz = (v1x * v2y) - (v1y * v2x).
EXIT PROGRAM.
| 29.142857 | 72 | 0.529412 |
e510fcd2e494ae1a3b898bcc516857a0d24ef084 | 184 | cob | COBOL | Experimentation/parseGADT/src/test.cob | svenssonjoel/COPPE | 8a2a0b3ee09ba70fa59b85dfaffe510b1882209b | [
"BSD-3-Clause"
] | null | null | null | Experimentation/parseGADT/src/test.cob | svenssonjoel/COPPE | 8a2a0b3ee09ba70fa59b85dfaffe510b1882209b | [
"BSD-3-Clause"
] | null | null | null | Experimentation/parseGADT/src/test.cob | svenssonjoel/COPPE | 8a2a0b3ee09ba70fa59b85dfaffe510b1882209b | [
"BSD-3-Clause"
] | null | null | null |
recipe apa {
conv [strides := [2, 2, 2]]
relu []
batch_normalize []
}
recipe bepa {
conv [strides := [3,3]]
relu []
apa
}
model my_model {
apa
apa
bepa
bepa
}
| 9.2 | 29 | 0.538043 |
8c4fc9ed9ef04e5c5d1063ea06cb002ed8f426b7 | 1,695 | cbl | COBOL | dates/floor-div.cbl | brazilofmux/gnucobol | fa8dfb6ce20ad3f0d6620e4e883f1951b48c4c64 | [
"MIT"
] | 4 | 2020-07-16T14:45:10.000Z | 2022-02-10T03:37:26.000Z | dates/floor-div.cbl | brazilofmux/gnucobol | fa8dfb6ce20ad3f0d6620e4e883f1951b48c4c64 | [
"MIT"
] | 1 | 2020-05-24T09:11:22.000Z | 2020-05-24T15:09:30.000Z | dates/floor-div.cbl | brazilofmux/gnucobol | fa8dfb6ce20ad3f0d6620e4e883f1951b48c4c64 | [
"MIT"
] | null | null | null | *>*****************************************************************
*> floor-div *
*> Copyright (C) 2000 Solid Vertical Domains, Ltd. *
*> and Stephen Dennis *
*> Copyright (C) 2020 Stephen Dennis *
*> Available under MIT License. *
*> *
*> The following "Floor Division" routine calculates the proper *
*> modulus of a negative number. For negative numbers, a modulus *
*> is different than a remainder. The modulus is always positive. *
*> *
*> For example, -1 floordivmod 2 gives a FDM-DIV of -1 with a *
*> FDM-MOD of +1. In other words, -1/2 ==> -1 + 1/2 *
*> *
*> In contrast, a remainder approach gives a different answer: *
*> -1/2 ==> 0 + -1/2 *
*>*****************************************************************
identification division.
function-id. floor-div.
data division.
working-storage section.
01 fdm-tmp pic s9(8) comp-5.
linkage section.
01 fdm-x pic s9(8) comp-5.
01 fdm-y pic s9(8) comp-5.
01 fdm-div pic s9(8) comp-5.
procedure division using fdm-x fdm-y returning fdm-div.
0100-main.
if fdm-x >= 0
divide fdm-y into fdm-x giving fdm-div
else
add 1 to fdm-x giving fdm-tmp
subtract fdm-y from fdm-tmp
divide fdm-y into fdm-tmp giving fdm-div
end-if.
goback.
end function floor-div.
| 43.461538 | 67 | 0.440118 |
b5d1df5ace0a3bdda69e7442acfc9fd1bc5c7f1d | 110 | cbl | COBOL | Cobol/helloWorld.cbl | godslayer201/Hello-World | 0b0dec4f8d18d2db348ee4fd0fad8233dd9074a4 | [
"MIT"
] | null | null | null | Cobol/helloWorld.cbl | godslayer201/Hello-World | 0b0dec4f8d18d2db348ee4fd0fad8233dd9074a4 | [
"MIT"
] | null | null | null | Cobol/helloWorld.cbl | godslayer201/Hello-World | 0b0dec4f8d18d2db348ee4fd0fad8233dd9074a4 | [
"MIT"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. HELLO.
PROCEDURE DIVISION.
DISPLAY 'Hello World'.
STOP RUN. | 18.333333 | 27 | 0.7 |
cccfc102f1b0fe191fc8542b01578ed17afd2eeb | 732 | cbl | COBOL | Collatz.cbl | axtens/cobol_for_exercism | 0405c9de1b77c423de8996f3bb92f6781a886a78 | [
"MIT"
] | 1 | 2021-09-28T18:06:32.000Z | 2021-09-28T18:06:32.000Z | Collatz.cbl | axtens/cobol_for_exercism | 0405c9de1b77c423de8996f3bb92f6781a886a78 | [
"MIT"
] | null | null | null | Collatz.cbl | axtens/cobol_for_exercism | 0405c9de1b77c423de8996f3bb92f6781a886a78 | [
"MIT"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. Collatz.
ENVIRONMENT DIVISION.
DATA DIVISION.
LINKAGE SECTION.
01 LS-COUNT PIC 9(5).
01 LS-START PIC 9(5).
PROCEDURE DIVISION USING LS-START RETURNING LS-COUNT.
01-START.
IF LS-START <= 0
MOVE -1 TO LS-COUNT
EXIT PROGRAM
END-IF.
MOVE ZEROES TO LS-COUNT.
PERFORM 02-COLLATZ WITH TEST BEFORE UNTIL LS-START = 1.
STOP RUN.
02-COLLATZ.
IF FUNCTION REM(LS-START, 2) = 0
ADD 1 TO LS-COUNT
DIVIDE LS-START BY 2 GIVING LS-START
ELSE
ADD 1 TO LS-COUNT
COMPUTE LS-START = LS-START * 3 + 1
END-IF.
| 28.153846 | 63 | 0.532787 |
46c90a6a6ce04c37c8368168dee415de694933bd | 2,268 | cpy | COBOL | HospitalAppDemo/copybook/MEDICATN.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | HospitalAppDemo/copybook/MEDICATN.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | HospitalAppDemo/copybook/MEDICATN.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | ******************************************************************
* DCLGEN TABLE(DDS0001.MEDICATION) *
* LIBRARY(DDS0001.TEST.COPYLIB(MEDICATN)) *
* ACTION(REPLACE) *
* LANGUAGE(COBOL) *
* QUOTE *
* DBCSDELIM(NO) *
* ... IS THE DCLGEN COMMAND THAT MADE THE FOLLOWING STATEMENTS *
******************************************************************
EXEC SQL DECLARE DDS0001.MEDICATION TABLE
( MEDICATION_ID CHAR(8),
MED_NAME CHAR(40),
SHORT_DESCRIPTION CHAR(100),
COST DECIMAL(7, 2),
PHARMACY_COST DECIMAL(5, 2)
) END-EXEC.
******************************************************************
* COBOL DECLARATION FOR TABLE DDS0001.MEDICATION *
******************************************************************
01 DCLMEDICATION.
10 MEDICATION-ID PIC X(8).
10 MED-NAME PIC X(40).
10 SHORT-DESCRIPTION PIC X(100).
10 COST PIC S9(5)V9(2) USAGE COMP-3.
10 PHARMACY-COST PIC S9(3)V9(2) USAGE COMP-3.
******************************************************************
* THE NUMBER OF COLUMNS DESCRIBED BY THIS DECLARATION IS 5 *
******************************************************************
| 78.206897 | 80 | 0.222663 |
e9c7a52aca0cea5d3b3f15c73a9acd468d2d8871 | 2,240 | cbl | COBOL | tests/theia_automation_lsp/test_files/cobol/USERC1N1.cbl | grianbrcom/che-che4z-lsp-for-cobol | 9b7fa4dc6c670f311685949992d102b282fdfbc5 | [
"Apache-2.0"
] | null | null | null | tests/theia_automation_lsp/test_files/cobol/USERC1N1.cbl | grianbrcom/che-che4z-lsp-for-cobol | 9b7fa4dc6c670f311685949992d102b282fdfbc5 | [
"Apache-2.0"
] | 1 | 2020-04-16T12:31:43.000Z | 2020-04-16T12:33:53.000Z | tests/theia_automation_lsp/test_files/cobol/USERC1N1.cbl | grianbrcom/che-che4z-lsp-for-cobol | 9b7fa4dc6c670f311685949992d102b282fdfbc5 | [
"Apache-2.0"
] | null | null | null | * Copyright (c) 2020 Broadcom. *
* The term "Broadcom" refers to Broadcom Inc. and/or its *
* subsidiaries. *
* *
* This program and the accompanying materials are made *
* available under the terms of the Eclipse Public License 2.0 *
* which is available at https://www.eclipse.org/legal/epl-2.0/ *
* *
* SPDX-License-Identifier: EPL-2.0 *
* *
* Contributors: *
* Broadcom, Inc. - initial API and implementation *
****************************************************************
Identification Division.
Program-id. HELLO-WORLD.
Data Division.
Working-Storage Section.
COPY BOOK1N.
01 BOOK2-REC.
01 User-Num1 PIC 9(9).
01 User-Num2 PIC 9(9).
01 User-Address.
05 User-City PIC X(5).
05 User-Country PIC X(5).
05 User-Index PIC 9(6).
05 User-Phone PIC 9(6).
Procedure Division.
000-Main-Logic.
Perform 100-Print-User.
Stop Run.
100-Print-User.
Move 123456789 To User-Num1.
Move User-Num1 To User-Num2.
Move 'Wenceslav Square 846/1' To User-Address.
Move 'Prague' To User-City.
Move 'CZ' To User-Country.
Move 11000 To User-Index.
Move 777123456 To User-Phone.
Move 777987654 To User-Phone-Mobile.
Display "User-Num1 : " User-Num1.
Display "User-Num2 : " User-Num2.
Display "User-Address : " User-Address.
Display "User-City : " User-City.
Display "User-Country : " User-Country.
Display "User-Index : " User-Index.
Display "User-Phone : " User-Phone.
Display "User-Phone-M : " User-Phone-Mobile.
End program HELLO-WORLD.
| 41.481481 | 70 | 0.439286 |
8fa146cb62b4800f05030514a91262bf34a0cb29 | 5,252 | cbl | COBOL | RPSGAERB.cbl | 10thTARDIS/COBOL_Projects_Spring_2017 | f056f335ba0a5baf1b2b426c0d96dd5a94293435 | [
"MIT"
] | null | null | null | RPSGAERB.cbl | 10thTARDIS/COBOL_Projects_Spring_2017 | f056f335ba0a5baf1b2b426c0d96dd5a94293435 | [
"MIT"
] | null | null | null | RPSGAERB.cbl | 10thTARDIS/COBOL_Projects_Spring_2017 | f056f335ba0a5baf1b2b426c0d96dd5a94293435 | [
"MIT"
] | null | null | null | 000100 IDENTIFICATION DIVISION.
000200 PROGRAM-ID. RPCGAMRB.
000300 AUTHOR. Ryan Brooks.
000400* ASK USED FOR ROCK, PAPER OR SCISSORS.
000500* COMPARE THEIR INPUT ANSSWER TO THE RANDOM NUMBER
000600* GENERATED BY THE PROGRAM. PROVIDE WINNER/LOSER FEEDBACK.
000700
000800 DATA DIVISION.
000900 WORKING-STORAGE SECTION.
001000
001100 01 WS-TODAYS-DATE pic x(08).
001200 01 WS-TIME.
001300 05 WS-TIME-HH pic 9(02).
001400 05 WS-TIME-MM PIC 9(02).
001500 05 WS-TIME-SS PIC 9(02).
001600 05 WS-TIME-MS.
001700 10 WS-TIME-MS1 PIC 9(01).
001800 10 WS-TIME-MS2 PIC 9(01).
001900 88 RANDOM-ROCK VALUE 0 1 2.
002000 88 RANDOM-PAPER VALUE 3 4 5.
002100 88 RANDOM-SCISSORS VALUE 6 7 8.
002200 88 VALID-RANDOM-DIGIT VALUE 0 THRU 8.
002300
002400 01 WS-CHOICE PIC X(01).
002500 88 ROCK-CHOSEN VALUE 'R' 'r'.
002600 88 PAPER-CHOSEN VALUE 'P' 'p'.
002700 88 SCISSORS-CHOSEN VALUE 'S' 's'.
002800 88 VALID-CHOICE VALUE 'R' 'r'
002900 'P' 'p'
003000 'S' 's'.
003100 01 ANY-KEY PIC X(01).
003200 PROCEDURE DIVISION.
003300 0000-MAINLINE.
003400 DISPLAY 'START RPSGAMRB BY RYAN BROOKS'.
003500 ACCEPT WS-TODAYS-DATE from date yyyymmdd.
003600 DISPLAY "PROGRAM EXECUTION DATE : " WS-TODAYS-DATE.
003700 ACCEPT WS-TIME from time.
003800 DISPLAY "PROGRAM EXECUTION START TIME: " WS-TIME.
003900
004000* PROMPT THE USER FOR GAME CHOICE UNTIL A VALID CHOICE IS MADE.
004100 PERFORM UNTIL VALID-CHOICE
004200 DISPLAY "R FOR ROCK, P FOR PAPER, S FOR SCISSORS"
004300 ACCEPT WS-CHOICE
004400 END-PERFORM
004500
004600* DISPLAY THE USERS CHOICE HERE WITH IF STATEMENTS.
004700* (YOU ADD THIS CODE):
004800 EVALUATE WS-CHOICE
004900 WHEN "R"
005000 DISPLAY "YOU CHOSE ROCK, SOLID CHOICE."
005100 WHEN "P"
005200 DISPLAY "YOU CHOSE PAPER, YOU HAVE THIS COVERED."
005300 WHEN "S"
005400 DISPLAY "YOU CHOSE SCISSORS, HOPE IT'S NOT A ROCK."
005500 WHEN "r"
005600 DISPLAY "YOU CHOSE ROCK, SOLID CHOICE."
005700 WHEN "p"
005800 DISPLAY "YOU CHOSE PAPER, YOU HAVE THIS COVERED."
005900 WHEN "s"
006000 DISPLAY "YOU CHOSE SCISSORS, HOPE IT'S NOT A ROCK."
006100 END-EVALUATE
006200
006300* QUASI-RANDOM NUMBER GENERATOR FOR GAME
006400 MOVE 9 TO WS-TIME-MS2.
006500 PERFORM UNTIL VALID-RANDOM-DIGIT
006600 ACCEPT WS-TIME from time
006700 END-PERFORM
006800 display "--------------------------"
006900 display "TIME DIGIT: " WS-TIME-MS2
007000
007100* WRITE CODE IF / EVALUATE TO DISPLAY THE COMPUTER CHOICE.
007200* (YOU ADD THIS CODE):
007300 evaluate true
007400 when RANDOM-ROCK and ROCK-CHOSEN
007500 display "The computer chooses rock."
007600 display "--------------------------"
007700 display "Tie!"
007800 when RANDOM-ROCK and PAPER-CHOSEN
007900 display "The computer chooses rock."
008000 display "--------------------------"
008100 DISPLAY "Paper wins equals you win."
008200 when RANDOM-ROCK and SCISSORS-CHOSEN
008300 display "The computer chooses rock."
008400 display "--------------------------"
008500 DISPLAY "Rock crushes scissors, computer wins."
008600 when RANDOM-PAPER AND ROCK-CHOSEN
008700 display "The computer chooses paper."
008800 display "--------------------------"
008900 DISPLAY "Paper beats rock, computer wins."
009000 when RANDOM-PAPER and PAPER-CHOSEN
009100 display "The computer chooses paper."
009200 display "--------------------------"
009300 DISPLAY "Tie!"
009400 WHEN RANDOM-PAPER and SCISSORS-CHOSEN
009500 display "The computer chooses paper."
009600 display "--------------------------"
009700 DISPLAY "Scissors win, paper loses; player wins."
009800 when RANDOM-SCISSORS and ROCK-CHOSEN
009900 display "The computer chooses scissors."
010000 display "--------------------------"
010100 DISPLAY "You win, you crushed the scissors."
010200 when RANDOM-SCISSORS and PAPER-CHOSEN
010300 display "The computer chooses scissors."
010400 display "--------------------------"
010500 DISPLAY "Scissors cuts paper, computer wins."
010600 WHEN RANDOM-SCISSORS and SCISSORS-CHOSEN
010700 display "The computer chooses scissors."
010800 display "--------------------------"
010900 DISPLAY "Tie!"
011000 END-EVALUATE.
011100* COMPARE THE USER INPUT TO THE RANDOM CHOICE
011200* RULES OF THE GAME ARE:
011300* PAPER COVERS ROCK - PAPER WINS ROCK LOSES
011400* ROCK CRUSHES SCISSORS - ROCK WINS, SCISSORS LOSES
011500* SCISSORS CUTS PAPER - SCISSORS WIN, PAPER LOSES
011600* USE THE EVALUTE TO DECLARE THE RESULTS.
011700* (YOU CODE THIS)
011800 display "Press any key to exit."
011900 accept any-key.
012000 GOBACK. | 43.766667 | 70 | 0.613481 |
a139b96141e3bbe207f48d3785e6b3dd7722e681 | 27,106 | cbl | COBOL | containment_unit.cbl | BSides-CT/ctf-challenge-containment-cobol | e0368ef02e4c08b41004acb52f2216f6c7ab10fb | [
"MIT"
] | 3 | 2020-11-14T22:05:20.000Z | 2020-11-27T05:32:40.000Z | containment_unit.cbl | BSides-CT/ctf-challenge-containment-cobol | e0368ef02e4c08b41004acb52f2216f6c7ab10fb | [
"MIT"
] | null | null | null | containment_unit.cbl | BSides-CT/ctf-challenge-containment-cobol | e0368ef02e4c08b41004acb52f2216f6c7ab10fb | [
"MIT"
] | null | null | null | *> setup the identification division
IDENTIFICATION DIVISION.
*> setup the program id
PROGRAM-ID. CONTAINMENTUNIT.
*> setup the procedure division (equiv. main() function)
DATA DIVISION.
*> Used for handling the file that stores the
*> CTF settings
WORKING-STORAGE SECTION.
01 HELLO PIC X(6) VALUE "Hello ".
01 WORLD PIC X(6) VALUE "World!".
*> Used for defining Menu item selection
01 WS-MENU PIC X VALUE "M".
*> CTF introduction screen
01 RESPONSE-INTRO.
05 RESPONSE-IN-LOGIN PIC X VALUE "X".
*> Login credentials when C pressed on Login page
01 LOGIN-MSG PIC X(15) VALUE "Please login".
01 RESPONSEC.
05 RESPONSE-IN-WS PIC X VALUE "C".
05 LOGGED-IN PIC X VALUE "F".
01 DATA-FROM-SCREEN.
05 ID-IN-WS PIC XXXX VALUE SPACES.
05 PWD-IN-WS PIC X(8) VALUE SPACES.
*> User data read in from file
01 WS-USERS-TABLE GLOBAL.
05 WS-USER OCCURS 8 TIMES INDEXED BY I.
10 WS-USER-ID PIC XXXX.
10 WS-USER-PWD PIC X(8).
10 WS-USER-DEBUG PIC X(6).
05 WS-EOF PIC A(1).
*> Menu item selection
01 MENURESPONSE.
05 RESPONSE-IN-MENU PIC X VALUE "X".
*> Settings screen
01 SETTINGSVALUES GLOBAL.
05 ACCOUNT-DEBUG PIC X(5) VALUE SPACES.
01 SETTINGSRESPONSE.
05 RESPONSE-IN-SETTINGS PIC X VALUE "X".
*> Status Screen
01 STAUSVALUES.
05 CONTAINMENT-STATUS PIC X(6) VALUE "CLOSED".
05 TCID50RELPFU PIC S9(1)V9(2) VALUE 0.69.
05 PSI PIC XXX VALUE "100".
01 STATUSRESPONSE.
05 RESPONSE-IN-STATUS PIC X VALUE "X".
*> Containment Unit Screen
01 CONTAINMENTVALUES.
05 CONTAINMENT-UNIT PIC X VALUE "C".
05 CONTAINMENT-FLAG PIC X(16)
VALUE "COVID2020ESCAPED".
01 CONTAINMENTRESPONSE.
05 RESPONSE-IN-CONTAINMENT PIC X VALUE "X".
*> Reload Users Menu
01 RELOADRESPONSE.
05 RESPONSE-IN-RELOAD PIC X VALUE "X".
05 RELOAD-FILE PIC X VALUE "N".
*> Debug Menu
01 DEBUGRESPONSE.
05 RESPONSE-IN-DEBUG PIC X VALUE "X".
05 DEBUG-SWITCH PIC X VALUE "N".
05 DEBUG-DAY PIC 9(2) VALUE 01.
05 DEBUG-MONTH PIC 9(2) VALUE 01.
05 DEBUG-YEAR PIC 9(4) VALUE 1999.
05 MOD-YEAR PIC 9(2) VALUE 00.
*> Date and Time handling for challenege
01 WS-CURRENT-DATE-DATA.
05 WS-CURRENT-DATE.
10 WS-CURRENT-YEAR PIC 9(4).
10 WS-CURRENT-MONTH PIC 9(2).
10 WS-CURRENT-DAY PIC 9(2).
05 WS-CURRENT-TIME.
10 WS-CURRENT-HOUR PIC 9(2).
10 WS-CURRENT-MIN PIC 9(2).
10 WS-CURRENT-SEC PIC 9(2).
10 WS-CURRENT-MS PIC 9(2).
05 WS-DIFF-FROM-GMT PIC S9(04).
SCREEN SECTION.
*> Introduction screen
01 INTRO-SCREEN.
05 VALUE "*********************************"
BLANK SCREEN LINE 1 COL 10.
05 VALUE "* COVID-2020 Containment Unit *"
LINE 2 COL 10.
05 VALUE "* Developed in 1984 *"
LINE 3 COL 10.
05 VALUE "* By the retro*causal engineers *"
LINE 4 COL 10.
05 VALUE "*********************************"
LINE 5 COL 10.
05 VALUE " "
LINE 6 COL 10.
05 VALUE " .*_; ;_*. "
FOREGROUND-COLOR 2 LINE 7 COL 10.
05 VALUE " / / \ \ "
FOREGROUND-COLOR 2 LINE 8 COL 10.
05 VALUE " | | | | "
FOREGROUND-COLOR 2 LINE 9 COL 10.
05 VALUE " \ \.***./ / "
FOREGROUND-COLOR 2 LINE 10 COL 10.
05 VALUE " .*'z .***. z'*. "
FOREGROUND-COLOR 2 LINE 11 COL 10.
05 VALUE " ,`.*z/ .'`***`'. \z*.`, "
FOREGROUND-COLOR 2 LINE 12 COL 10.
05 VALUE " '` | | \(_)/ | | `' "
FOREGROUND-COLOR 2 LINE 13 COL 10.
05 VALUE " , \ \ | | / / , "
FOREGROUND-COLOR 2 LINE 14 COL 10.
05 VALUE " ;`'.,_\ `*'*' /_,.'`; "
FOREGROUND-COLOR 2 LINE 15 COL 10.
05 VALUE " '*._ _.*'^'*._ _.*' "
FOREGROUND-COLOR 2 LINE 16 COL 10.
05 VALUE " `` `` "
FOREGROUND-COLOR 2 LINE 17 COL 10.
05 VALUE " Danger Biohazard "
FOREGROUND-COLOR 4 LINE 18 COL 10.
05 VALUE " PRESS L TO LOGIN: "
LINE 19 COL 10.
05 RESPONSE-INPUT LINE 19 COL 33
PIC X TO RESPONSE-IN-LOGIN.
05 VALUE "Welcome to the BSides CT 2020 CTF " LINE 21 COL 13.
05 VALUE "Challenge finale. If you completed " LINE 22 COL 13.
05 VALUE "the other CTF challenges you should " LINE 23 COL 13.
05 VALUE "have some clues on where to start! " LINE 24 COL 13.
05 VALUE "Background Story " LINE 26 COL 13.
05 VALUE "---------------- " LINE 27 COL 13.
05 VALUE "Our intrepid telnet traveling heroes" LINE 29 COL 13.
05 VALUE "traveled into the past to constuct " LINE 30 COL 13.
05 VALUE "a virus, that when unleashed will " LINE 31 COL 13.
05 VALUE "stop COVID-19. Your job is to break " LINE 32 COL 13.
05 VALUE "into the system & release COVID-20. " LINE 33 COL 13.
05 VALUE "The admin user was lost long ago so " LINE 34 COL 13.
05 VALUE "your only hope is to use your " LINE 35 COL 13.
05 VALUE "hacking skills. You will need to " LINE 36 COL 13.
05 VALUE "1. Log into the system " LINE 37 COL 13.
05 VALUE "2. Update an important account value" LINE 38 COL 13.
05 VALUE "3. Reset the systems clock to a " LINE 39 COL 13.
05 VALUE " mysterious date in the past " LINE 40 COL 13.
05 VALUE "Once complete you will see the key " LINE 41 COL 13.
05 VALUE "There may also be other keys to " LINE 42 COL 13.
05 VALUE "find along the way. " LINE 43 COL 13.
05 VALUE "Good Luck! " LINE 44 COL 13.
*> Login Screen
01 LOGIN-SCREEN.
05 VALUE "LOGIN SCREEN" BLANK SCREEN LINE 1 COL 10.
05 VALUE "------------" LINE 2 COL 10.
05 LOGIN-MESSAGE PIC X(15)
FROM LOGIN-MSG LINE 4 COL 10.
05 VALUE "User ID:"
FOREGROUND-COLOR 6 LINE 5 COL 10.
05 ID-INPUT LINE 5 COL 25
PIC X(4) TO ID-IN-WS.
05 VALUE "Password:"
FOREGROUND-COLOR 6 LINE 7 COL 10.
05 PWD-INPUT LINE 7 COL 25
PIC X(8) TO PWD-IN-WS.
05 VALUE "ENTER C TO CONTINUE:"
FOREGROUND-COLOR 2 LINE 12 COL 10.
05 RESPONSE-INPUT LINE 12 COL 31
PIC X TO RESPONSE-IN-WS.
*> Main Menu Screen
01 MAIN-MENU-SCREEN.
05 MENU-SECTION.
10 VALUE "MAIN MENU SCREEN"
BLANK SCREEN LINE 1 COL 10.
10 VALUE "----------------" LINE 2 COL 10.
10 VALUE "(S)ETTINGS - Software settings"
FOREGROUND-COLOR 6 LINE 3 COL 10.
10 VALUE "S(T)ATUS - Software/containment status"
FOREGROUND-COLOR 6 LINE 5 COL 10.
10 VALUE "CONTAINMENT (U)NIT - access the unit"
FOREGROUND-COLOR 6 LINE 7 COL 10.
10 VALUE "(Q)UIT - exit the program"
FOREGROUND-COLOR 6 LINE 9 COL 10.
10 VALUE "(R)ELOAD USERS - reload user file"
FOREGROUND-COLOR 6 LINE 11 COL 10.
05 DEBUG-SECTION.
10 VALUE "(D)EBUG - developer debug menu"
FOREGROUND-COLOR 4 LINE 13 COL 10.
05 OPTION-SECTION.
10 VALUE "PLEASE SELECT AN OPTION:"
LINE 15 COL 10.
10 RESPONSE-INPUT LINE 15 COL 34
PIC X TO RESPONSE-IN-MENU.
*> Settings screen for the application
*> Use this screen to view password
*> and other values.
01 SETTINGS-SCREEN.
05 VALUE "SETTINGS SCREEN"
BLANK SCREEN LINE 1 COL 10.
05 VALUE "----------------" LINE 2 COL 10.
05 VALUE "Use this screen to view settings"
FOREGROUND-COLOR 6 LINE 3 COL 10.
05 VALUE "Use the admin tool to update settings"
FOREGROUND-COLOR 6 LINE 4 COL 10.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 6 COL 10.
05 VALUE "User Settings"
FOREGROUND-COLOR 6 LINE 7 COL 10.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 8 COL 10.
05 VALUE "User ID:" LINE 10 COL 10.
05 ID-OUTPUT PIC XXXX FROM ID-IN-WS LINE 10 COL 25.
05 VALUE "Password:" LINE 11 COL 10.
05 PWD-OUT
PIC X(8) FROM PWD-IN-WS LINE 11 COL 27.
05 VALUE "Account debug mode:" LINE 12 COL 10.
05 ACC-EXPIRE-OUTPUT
PIC X(5) FROM ACCOUNT-DEBUG LINE 12 COL 30.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 16 COL 10.
05 VALUE "System Settings"
FOREGROUND-COLOR 6 LINE 17 COL 10.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 18 COL 10.
05 VALUE "PSI: "
FOREGROUND-COLOR 6 LINE 19 COL 10.
05 PSI-OUT
PIC XXX FROM PSI LINE 19 COL 26.
05 VALUE "Set TCID(5) and PFU: "
FOREGROUND-COLOR 6 LINE 20 COL 10.
05 TCIDPFU-OUT
PIC S9(1)V9(2) FROM TCID50RELPFU LINE 20 COL 32.
05 VALUE "BACK UP KEY: FLAG_TWO_IMIN"
FOREGROUND-COLOR 2 LINE 22 COL 10.
05 VALUE "PLEASE SELECT Q TO EXIT:" LINE 25 COL 10.
05 RESPONSE-INPUT
PIC X TO RESPONSE-IN-SETTINGS.
*> Status of the containment unit program
01 STATUS-SCREEN.
05 VALUE "STATUS SCREEN"
BLANK SCREEN LINE 1 COL 10.
05 VALUE "DATE: " LINE 1 COL 35.
05 DATE-OUTPUT
PIC 9(4)9(2)9(2) FROM WS-CURRENT-DATE
FOREGROUND-COLOR 2 LINE 1 COL 41.
05 VALUE "--------------" LINE 2 COL 10.
05 VALUE "Containment State: "
FOREGROUND-COLOR 6 LINE 4 COL 10.
05 CONTAINED-OUTPUT
PIC X(6) FROM CONTAINMENT-STATUS
FOREGROUND-COLOR 2 LINE 4 COL 35.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 6 COL 10.
05 VALUE "Lab Data"
FOREGROUND-COLOR 6 LINE 7 COL 10.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 8 COL 10.
05 VALUE "Relationship between TCID(50) and PFU: "
FOREGROUND-COLOR 6 LINE 9 COL 10.
05 TCID-OUTPUT
PIC S9(1)V9(2) FROM TCID50RELPFU
FOREGROUND-COLOR 2 LINE 9 COL 50.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 14 COL 10.
05 VALUE "Unit Details"
FOREGROUND-COLOR 6 LINE 15 COL 10.
05 VALUE "---------------------"
FOREGROUND-COLOR 6 LINE 16 COL 10.
05 VALUE "Serial Number: XT100"
FOREGROUND-COLOR 6 LINE 17 COL 10.
05 VALUE "Fuel Source: Nuclear"
FOREGROUND-COLOR 6 LINE 18 COL 10.
05 VALUE "Build Date: 12/12/86"
FOREGROUND-COLOR 6 LINE 19 COL 10.
05 VALUE "PSI: "
FOREGROUND-COLOR 6 LINE 20 COL 10.
05 PSI-OUTPUT
PIC XXX FROM PSI
FOREGROUND-COLOR 2 LINE 20 COL 17.
05 VALUE "System Maintainence: Good"
FOREGROUND-COLOR 2 BLINK LINE 23 COL 10.
05 VALUE "PRESS Q TO EXIT: " LINE 25 COL 10.
05 RESPONSE-STATUS
PIC X TO RESPONSE-IN-STATUS.
*> Reload Users Screen
01 RELOAD-USERS-SCREEN.
05 RELOAD-TITLE-SECTION.
10 VALUE "RELOAD USERS DATABASE SCREEN"
BLANK SCREEN LINE 1 COL 10.
05 RELOAD-FILE-SECTION.
10 VALUE "Reload the user database file (Y/N)?"
LINE 4 COL 10.
10 RESPONSE-RELOAD-FILE LINE 4 COL 47
PIC X TO RELOAD-FILE.
05 RELOAD-EXIT-SECTION.
10 VALUE "PRESS Q TO EXIT: " LINE 8 COL 10.
10 RESPONSE-RELOAD
PIC X TO RESPONSE-IN-RELOAD.
*> Debug Menu
01 DEBUG-SCREEN.
05 DEBUG-TITLE-SECTION.
10 VALUE "DEBUG SCREEN"
BLANK SCREEN LINE 1 COL 10.
05 DISABLE-DATE-SECTION.
10 VALUE "Disable date debug (Y/N):" LINE 4 COL 10.
10 RESPONSE-DEBUG-SWITCH LINE 4 COL 35
PIC X TO DEBUG-SWITCH.
05 DEBUG-DATE-SETTING-SECTION.
10 VALUE "Set day:" LINE 6 COL 10.
10 RESPONSE-DEBUG-DAY LINE 6 COL 19
PIC 9(2) TO DEBUG-DAY.
10 VALUE "Set month:" LINE 7 COL 10.
10 RESPONSE-DEBUG-MONTH LINE 7 COL 21
PIC 9(2) TO DEBUG-MONTH.
10 VALUE "Set year:" LINE 8 COL 10.
10 RESPONSE-DEBUG-YEAR LINE 8 COL 20
PIC 9(4) TO DEBUG-YEAR.
05 DEBUG-EXIT-SECTION.
10 VALUE "PRESS Q TO EXIT: " LINE 15 COL 10.
10 RESPONSE-DEBUG
PIC X TO RESPONSE-IN-DEBUG.
*> Containment Unit Chamber Closed
01 CONTAINMENT-SCREEN.
05 CONTAINMENT-LIVE-VIEW-SECTION.
10 VALUE "CONTAINMENT UNIT LIVE VIEW"
BLANK SCREEN LINE 1 COL 10.
10 VALUE "--------------------------"
LINE 2 COL 10.
05 CONTAINMENT-CLOSED-UNIT-SECTION.
10 VALUE "|---------------------------|"
FOREGROUND-COLOR 2 LINE 5 COL 10.
10 VALUE "|COVID-2020 Containment Unit|"
FOREGROUND-COLOR 2 BLINK LINE 6 COL 10.
10 VALUE "| .*_; ;_*. |"
FOREGROUND-COLOR 2 LINE 7 COL 10.
10 VALUE "| / / \ \ |"
FOREGROUND-COLOR 2 LINE 8 COL 10.
10 VALUE "| | | | | |"
FOREGROUND-COLOR 2 LINE 9 COL 10.
10 VALUE "| \ \.***./ / |"
FOREGROUND-COLOR 2 LINE 10 COL 10.
10 VALUE "| .*'z .***. z'*. |"
FOREGROUND-COLOR 2 LINE 11 COL 10.
10 VALUE "| ,`.*z/ .'`***`'. \z*.`, |"
FOREGROUND-COLOR 2 LINE 12 COL 10.
10 VALUE "| '` | | \(_)/ | | `' |"
FOREGROUND-COLOR 2 LINE 13 COL 10.
10 VALUE "| , \ \ | | / / , |"
FOREGROUND-COLOR 2 LINE 14 COL 10.
10 VALUE "| ;`'.,_\ `*'*' /_,.'`; |"
FOREGROUND-COLOR 2 LINE 15 COL 10.
10 VALUE "| '*._ _.*'^'*._ _.*' |"
FOREGROUND-COLOR 2 LINE 16 COL 10.
10 VALUE "| `` `` |"
FOREGROUND-COLOR 2 LINE 17 COL 10.
10 VALUE "|---------------------------|"
FOREGROUND-COLOR 2 LINE 18 COL 10.
10 VALUE " Status: "
FOREGROUND-COLOR 2 LINE 19 COL 10.
10 UNIT-OUTPUT
PIC X(6) FROM CONTAINMENT-STATUS
FOREGROUND-COLOR 2 LINE 19 COL 25.
*> Containment Unit Opened
05 CONTAINMENT-OPENED-UNIT-SECTION.
10 VALUE "CONTAINMENT UNIT LIVE VIEW"
BLANK SCREEN LINE 1 COL 10.
10 VALUE "--------------------------"
LINE 2 COL 10.
10 VALUE "|---------------------------|"
FOREGROUND-COLOR 4 LINE 5 COL 10.
10 VALUE "|COVID-2020 Containment Unit|"
FOREGROUND-COLOR 4 LINE 6 COL 10.
10 VALUE "| .*_; ;_*. |"
FOREGROUND-COLOR 4 BLINK LINE 7 COL 10.
10 VALUE "| / / \ \ |"
FOREGROUND-COLOR 4 BLINK LINE 8 COL 10.
10 VALUE "| | | | | |"
FOREGROUND-COLOR 4 BLINK LINE 9 COL 10.
10 VALUE "| \ \.***./ / |"
FOREGROUND-COLOR 4 BLINK LINE 10 COL 10.
10 VALUE "| .*'z .***. z'*. |"
FOREGROUND-COLOR 4 BLINK LINE 11 COL 10.
10 VALUE "| ,`.*z/ .'`***`'. \z*.`, |"
FOREGROUND-COLOR 4 BLINK LINE 12 COL 10.
10 VALUE "| '` | | \(_)/ | | `' |"
FOREGROUND-COLOR 4 BLINK LINE 13 COL 10.
10 VALUE "| , \ \ | | / / , |"
FOREGROUND-COLOR 4 BLINK LINE 14 COL 10.
10 VALUE "| ;`'.,_\ `*'*' /_,.'`; |"
FOREGROUND-COLOR 4 BLINK LINE 15 COL 10.
10 VALUE "| '*._ _.*'^'*._ _.*' |"
FOREGROUND-COLOR 4 BLINK LINE 16 COL 10.
10 VALUE "| `` `` |"
FOREGROUND-COLOR 4 BLINK LINE 17 COL 10.
10 VALUE "|---------------------------|"
FOREGROUND-COLOR 4 LINE 18 COL 10.
10 VALUE " Status: "
FOREGROUND-COLOR 4 LINE 19 COL 10.
10 UNIT-OUTPUT
PIC X(6) FROM CONTAINMENT-STATUS
FOREGROUND-COLOR 4 LINE 19 COL 25.
10 FLAG-OUTPUT
PIC X(16) FROM CONTAINMENT-FLAG
FOREGROUND-COLOR 4 LINE 20 COL 15.
05 CONTAINMENT-COMMAND-SECTION.
10 VALUE "PRESS Q TO EXIT: " LINE 22 COL 10.
10 RESPONSE-CONTAINMENT
PIC X TO RESPONSE-IN-CONTAINMENT.
PROCEDURE DIVISION.
*> Call decrypt module
*> https://gnucobol.sourceforge.io/historical/open-cobol/Static-COBOL-to-C.html
*> https://www.techiedelight.com/des-implementation-c/
*> Read settings file
CALL "LOADUSERS" END-CALL.
*> Render welcome/intro screen
PERFORM UNTIL RESPONSE-IN-LOGIN = "L"
DISPLAY INTRO-SCREEN
ACCEPT INTRO-SCREEN
END-PERFORM.
*> Render and handle response for login screen
PERFORM UNTIL (RESPONSE-IN-WS = "C" AND LOGGED-IN = "T")
DISPLAY LOGIN-SCREEN
ACCEPT LOGIN-SCREEN
PERFORM TEST AFTER VARYING I FROM 1 BY 1 UNTIL I = 8
IF WS-USER-ID(I) = ID-IN-WS
AND WS-USER-PWD(I) = PWD-IN-WS THEN
MOVE "T" TO LOGGED-IN
MOVE WS-USER-DEBUG(I) TO ACCOUNT-DEBUG
END-IF
END-PERFORM
MOVE "Login failed." TO LOGIN-MSG
END-PERFORM.
CALL "ROT13" END-CALL.
*> Handle main menu
PERFORM UNTIL WS-MENU = "Q"
IF (WS-CURRENT-DATE = 20000101) THEN
MOVE "OPENED" TO CONTAINMENT-STATUS
ELSE
IF (DEBUG-SWITCH = "N") THEN
MOVE FUNCTION CURRENT-DATE TO WS-CURRENT-DATE-DATA
MOVE FUNCTION MOD (WS-CURRENT-YEAR 2000) TO MOD-YEAR
IF MOD-YEAR > 0 THEN
MOVE 1999 TO WS-CURRENT-YEAR
END-IF
END-IF
END-IF
EVALUATE WS-MENU
WHEN "M" DISPLAY MENU-SECTION
IF ACCOUNT-DEBUG = "ALLOW" THEN
DISPLAY DEBUG-SECTION
END-IF
DISPLAY OPTION-SECTION
ACCEPT OPTION-SECTION
MOVE RESPONSE-IN-MENU TO WS-MENU
WHEN "R" DISPLAY RELOAD-TITLE-SECTION
DISPLAY RELOAD-FILE-SECTION
ACCEPT RELOAD-FILE-SECTION
DISPLAY RELOAD-EXIT-SECTION
ACCEPT RELOAD-EXIT-SECTION
IF RELOAD-FILE = "Y" THEN
CALL "LOADUSERS" END-CALL
CALL "ROT13" END-CALL
END-IF
MOVE "M" TO WS-MENU
WHEN "S" DISPLAY SETTINGS-SCREEN
ACCEPT SETTINGS-SCREEN
MOVE "M" TO WS-MENU
WHEN "D" IF (ACCOUNT-DEBUG = "ALLOW") THEN
DISPLAY DEBUG-TITLE-SECTION
DISPLAY DISABLE-DATE-SECTION
ACCEPT DISABLE-DATE-SECTION
IF (DEBUG-SWITCH = "Y") THEN
DISPLAY DEBUG-DATE-SETTING-SECTION
ACCEPT DEBUG-DATE-SETTING-SECTION
MOVE DEBUG-YEAR TO WS-CURRENT-YEAR
MOVE DEBUG-MONTH TO WS-CURRENT-MONTH
MOVE DEBUG-DAY TO WS-CURRENT-DAY
MOVE "Y" TO DEBUG-SWITCH
ELSE
MOVE "N" TO DEBUG-SWITCH
END-IF
DISPLAY DEBUG-EXIT-SECTION
ACCEPT DEBUG-EXIT-SECTION
END-IF
MOVE "M" TO WS-MENU
DISPLAY WS-MENU
WHEN "T" DISPLAY STATUS-SCREEN
ACCEPT STATUS-SCREEN
MOVE "M" TO WS-MENU
WHEN "U" DISPLAY CONTAINMENT-LIVE-VIEW-SECTION
IF (CONTAINMENT-STATUS = "OPENED") THEN
DISPLAY CONTAINMENT-OPENED-UNIT-SECTION
ELSE
DISPLAY CONTAINMENT-CLOSED-UNIT-SECTION
END-IF
DISPLAY CONTAINMENT-COMMAND-SECTION
ACCEPT CONTAINMENT-COMMAND-SECTION
MOVE "M" TO WS-MENU
WHEN other MOVE "M" TO WS-MENU
END-EVALUATE
END-PERFORM.
*> End program
STOP RUN.
IDENTIFICATION DIVISION.
PROGRAM-ID. LOADUSERS.
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT USERS ASSIGN TO '/opt/cu/decrypted_users.txt'
ORGANIZATION IS LINE SEQUENTIAL.
DATA DIVISION.
*> Used for handling the file that stores the
*> CTF settings
FILE SECTION.
FD USERS.
01 USERS-FILE.
05 USER-ID PIC XXXX.
05 USER-PWD PIC X(8).
05 USER-EXP PIC X(6).
PROCEDURE DIVISION.
000-Main.
CALL "decrypt_users".
OPEN INPUT USERS.
PERFORM VARYING I FROM 1 BY 1 UNTIL WS-EOF='Y'
READ USERS INTO WS-USER (I)
AT END MOVE 'Y' TO WS-EOF
END-READ
END-PERFORM.
CLOSE USERS.
GOBACK.
END PROGRAM LOADUSERS.
IDENTIFICATION DIVISION.
PROGRAM-ID. ROT13.
PROCEDURE DIVISION.
000-Main.
INSPECT ACCOUNT-DEBUG REPLACING
ALL "A" BY "N"
ALL "B" BY "O"
ALL "C" BY "P"
ALL "D" BY "Q"
ALL "E" BY "R"
ALL "F" BY "S"
ALL "G" BY "T"
ALL "H" BY "U"
ALL "I" BY "V"
ALL "J" BY "W"
ALL "K" BY "X"
ALL "L" BY "Y"
ALL "M" BY "Z"
ALL "N" BY "A"
ALL "O" BY "B"
ALL "P" BY "C"
ALL "Q" BY "D"
ALL "R" BY "E"
ALL "S" BY "F"
ALL "T" BY "G"
ALL "U" BY "H"
ALL "V" BY "I"
ALL "W" BY "J"
ALL "X" BY "K"
ALL "Y" BY "L"
ALL "Z" BY "M"
GOBACK.
END PROGRAM ROT13.
END PROGRAM CONTAINMENTUNIT.
| 45.556303 | 86 | 0.425773 |
6269100e89c449e190eacca4309862a071f79799 | 5,148 | cobol | COBOL | Task/Text-processing-2/COBOL/text-processing-2.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Text-processing-2/COBOL/text-processing-2.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Text-processing-2/COBOL/text-processing-2.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. text-processing-2.
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT readings ASSIGN Input-File-Path
ORGANIZATION LINE SEQUENTIAL
FILE STATUS file-status.
DATA DIVISION.
FILE SECTION.
FD readings.
01 reading-record.
03 date-stamp PIC X(10).
03 FILLER PIC X.
03 input-data PIC X(300).
LOCAL-STORAGE SECTION.
78 Input-File-Path VALUE "readings.txt".
78 Num-Data-Points VALUE 48.
01 file-status PIC XX.
01 current-line PIC 9(5).
01 num-date-stamps-read PIC 9(5).
01 read-date-stamps-area.
03 read-date-stamps PIC X(10) OCCURS 1 TO 10000 TIMES
DEPENDING ON num-date-stamps-read
INDEXED BY date-stamp-idx.
01 offset PIC 999.
01 data-len PIC 999.
01 data-flag PIC X.
88 data-not-found VALUE "N".
01 data-field PIC X(25).
01 i PIC 99.
01 num-good-readings PIC 9(5).
01 reading-flag PIC X.
88 bad-reading VALUE "B".
01 delim PIC X.
PROCEDURE DIVISION.
DECLARATIVES.
readings-error SECTION.
USE AFTER ERROR ON readings
DISPLAY "An error occurred while using " Input-File-Path
DISPLAY "Error code " file-status
DISPLAY "The program will terminate."
CLOSE readings
GOBACK
.
END DECLARATIVES.
main-line.
OPEN INPUT readings
*> Process each line of the file.
PERFORM FOREVER
READ readings
AT END
EXIT PERFORM
END-READ
ADD 1 TO current-line
IF reading-record = SPACES
DISPLAY "Line " current-line " is blank."
EXIT PERFORM CYCLE
END-IF
PERFORM check-duplicate-date-stamp
*> Check there are 24 data pairs and see if all the
*> readings are ok.
INITIALIZE offset, reading-flag, data-flag
PERFORM VARYING i FROM 1 BY 1 UNTIL Num-Data-Points < i
PERFORM get-next-field
IF data-not-found
DISPLAY "Line " current-line " has missing "
"fields."
SET bad-reading TO TRUE
EXIT PERFORM
END-IF
*> Every other data field is the instrument flag.
IF FUNCTION MOD(i, 2) = 0 AND NOT bad-reading
IF FUNCTION NUMVAL(data-field) <= 0
SET bad-reading TO TRUE
END-IF
END-IF
ADD data-len TO offset
END-PERFORM
IF NOT bad-reading
ADD 1 TO num-good-readings
END-IF
END-PERFORM
CLOSE readings
*> Display results.
DISPLAY SPACE
DISPLAY current-line " lines read."
DISPLAY num-good-readings " have good readings for all "
"instruments."
GOBACK
.
check-duplicate-date-stamp.
SEARCH read-date-stamps
AT END
ADD 1 TO num-date-stamps-read
MOVE date-stamp
TO read-date-stamps (num-date-stamps-read)
WHEN read-date-stamps (date-stamp-idx) = date-stamp
DISPLAY "Date " date-stamp " is duplicated at "
"line " current-line "."
END-SEARCH
.
get-next-field.
INSPECT input-data (offset:) TALLYING offset
FOR LEADING X"09"
*> The fields are normally delimited by a tab.
MOVE X"09" TO delim
PERFORM find-num-chars-before-delim
*> If the delimiter was not found...
IF FUNCTION SUM(data-len, offset) > 300
*> The data may be delimited by a space if it is at the
*> end of the line.
MOVE SPACE TO delim
PERFORM find-num-chars-before-delim
IF FUNCTION SUM(data-len, offset) > 300
SET data-not-found TO TRUE
EXIT PARAGRAPH
END-IF
END-IF
IF data-len = 0
SET data-not-found TO TRUE
EXIT PARAGRAPH
END-IF
MOVE input-data (offset:data-len) TO data-field
.
find-num-chars-before-delim.
INITIALIZE data-len
INSPECT input-data (offset:) TALLYING data-len
FOR CHARACTERS BEFORE delim
.
| 31.390244 | 70 | 0.469891 |
0b95bcd41dfbcbdde08727b5111d62b60827d4e4 | 2,516 | cobol | COBOL | Task/Sorting-algorithms-Bead-sort/COBOL/sorting-algorithms-bead-sort.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Sorting-algorithms-Bead-sort/COBOL/sorting-algorithms-bead-sort.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Sorting-algorithms-Bead-sort/COBOL/sorting-algorithms-bead-sort.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | >>SOURCE FORMAT FREE
*> This code is dedicated to the public domain
*> This is GNUCOBOL 2.0
identification division.
program-id. beadsort.
environment division.
configuration section.
repository. function all intrinsic.
data division.
working-storage section.
01 filler.
03 row occurs 9 pic x(9).
03 r pic 99.
03 r1 pic 99.
03 r2 pic 99.
03 pole pic 99.
03 a-lim pic 99 value 9.
03 a pic 99.
03 array occurs 9 pic 9.
01 NL pic x value x'0A'.
procedure division.
start-beadsort.
*> fill the array
compute a = random(seconds-past-midnight)
perform varying a from 1 by 1 until a > a-lim
compute array(a) = random() * 10
end-perform
perform display-array
display space 'initial array'
*> distribute the beads
perform varying r from 1 by 1 until r > a-lim
move all '.' to row(r)
perform varying pole from 1 by 1 until pole > array(r)
move 'o' to row(r)(pole:1)
end-perform
end-perform
display NL 'initial beads'
perform display-beads
*> drop the beads
perform varying pole from 1 by 1 until pole > a-lim
move a-lim to r2
perform find-opening
compute r1 = r2 - 1
perform find-bead
perform until r1 = 0 *> no bead or no opening
*> drop the bead
move '.' to row(r1)(pole:1)
move 'o' to row(r2)(pole:1)
*> continue up the pole
compute r2 = r2 - 1
perform find-opening
compute r1 = r2 - 1
perform find-bead
end-perform
end-perform
display NL 'dropped beads'
perform display-beads
*> count the beads in each row
perform varying r from 1 by 1 until r > a-lim
move 0 to array(r)
inspect row(r) tallying array(r)
for all 'o' before initial '.'
end-perform
perform display-array
display space 'sorted array'
stop run
.
find-opening.
perform varying r2 from r2 by -1
until r2 = 1 or row(r2)(pole:1) = '.'
continue
end-perform
.
find-bead.
perform varying r1 from r1 by -1
until r1 = 0 or row(r1)(pole:1) = 'o'
continue
end-perform
.
display-array.
display space
perform varying a from 1 by 1 until a > a-lim
display space array(a) with no advancing
end-perform
.
display-beads.
perform varying r from 1 by 1 until r > a-lim
display row(r)
end-perform
.
end program beadsort.
| 25.414141 | 62 | 0.601351 |
1fd81aa56e5b15315f29a9e3539951e12bb4bd58 | 1,637 | cpy | COBOL | chapter-10/serverless/InterestCalculator/src/ACCOUNT-RECORD.cpy | MicroFocus/visual-cobol-for--java-developers-book | d46a5f173e4f8df67456dab3b9ce52fe0c7fceaa | [
"MIT"
] | 2 | 2022-01-04T20:05:39.000Z | 2022-01-21T10:03:14.000Z | chapter-10/serverless/InterestCalculator/src/ACCOUNT-RECORD.cpy | MicroFocus/visual-cobol-for--java-developers-book | d46a5f173e4f8df67456dab3b9ce52fe0c7fceaa | [
"MIT"
] | null | null | null | chapter-10/serverless/InterestCalculator/src/ACCOUNT-RECORD.cpy | MicroFocus/visual-cobol-for--java-developers-book | d46a5f173e4f8df67456dab3b9ce52fe0c7fceaa | [
"MIT"
] | 2 | 2021-10-06T00:55:11.000Z | 2022-01-31T16:44:59.000Z | *****************************************************************
* *
* Copyright (C) 2020-2022 Micro Focus. All Rights Reserved. *
* This software may be used, modified, and distributed *
* (provided this notice is included without modification) *
* solely for demonstration purposes with other *
* Micro Focus software, and is otherwise subject to the EULA at *
* https://www.microfocus.com/en-us/legal/software-licensing. *
* *
* THIS SOFTWARE IS PROVIDED "AS IS" AND ALL IMPLIED *
* WARRANTIES, INCLUDING THE IMPLIED WARRANTIES OF *
* MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE, *
* SHALL NOT APPLY. *
* TO THE EXTENT PERMITTED BY LAW, IN NO EVENT WILL *
* MICRO FOCUS HAVE ANY LIABILITY WHATSOEVER IN CONNECTION *
* WITH THIS SOFTWARE. *
* *
*****************************************************************
* ACCOUNT-RECORD
01 (PREFIX)-ACCOUNT.
03 (PREFIX)-ACCOUNT-ID PIC X(4) COMP-X.
03 (PREFIX)-CUSTOMER-ID PIC X(4) COMP-X.
03 (PREFIX)-BALANCE PIC S9(12)V99 COMP-3.
03 (PREFIX)-TYPE PIC X.
03 (PREFIX)-CREDIT-LIMIT PIC S9(12)V99 COMP-3.
| 60.62963 | 71 | 0.41234 |
b9b35373864c4608c5d2a0c5e7c3f7da7b6b36fc | 707 | cbl | COBOL | cobol/testdata/local/test9021.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/test9021.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/test9021.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | Identification Division.
Program-ID. test9021.
Procedure Division.
debug perform until x > z-end - 1
debug if ls-disperr (x:2) = x'0d25'
debug compute z = x - y
debug if z = zero
debug display ' '
debug else
debug display ls-disperr (y:z)
debug end-if
debug compute y = x + 2
debug add 1 to x
debug end-if
debug add 1 to x
debug end-perform
debug if y < z-end
debug compute z = (z-end + 1) - y
debug display ls-disperr (y:z)
debug end-if
goback.
| 32.136364 | 49 | 0.448373 |
69aa13d6ae27fe0f2d93ab9e32d44f3bd4b3be8f | 1,205 | cbl | COBOL | cobol/testdata/local/testantlr146.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr146.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr146.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | 000001 Identification Division.
000002 Program-ID. testantlr146.
000003 Data Division.
000004 Working-Storage Section.
000005
000006 >>DEFINE A 2
000007 >>DEFINE B 3
000008 >>DEFINE C A + B
000009 >>DEFINE D A * B
000010 >>DEFINE E (D * A) / 3
000011
000012 01 CONSTANTS.
000013 05 MYNAME PIC X(012) VALUE 'testantlr146'.
000014 05 PGM-0001 PIC X(008) VALUE 'PGMA0001'.
000015 05 PGM-0002 PIC X(008) VALUE 'PGMA0002'.
000016 05 PGM-0003 PIC X(008) VALUE 'PGMA0003'.
000017 05 PGM-0009 PIC X(008) VALUE 'PGMA0009'.
000018
000019*
000020
000021 Procedure Division.
000022 DISPLAY MYNAME ' Begin'
000023
000024 >>EVALUATE TRUE
000025 >>WHEN C = 5
000026 CALL PGM-0001 USING
000027 MYNAME
000028 END-CALL
000029 >>WHEN D = 6
000030 CALL PGM-0002
000031 MYNAME
000032 END-CALL
000033 >>WHEN E = 4
000034 CALL PGM-0003
000035 MYNAME
000036 END-CALL
000037 >>WHEN OTHER
000038 CALL PGM-0009
000039 MYNAME
000040 END-CALL
000041 >>END-EVALUATE
000042
000043 DISPLAY MYNAME ' End'
000044
000045 GOBACK
000046 .
000047
000048
| 24.591837 | 68 | 0.643154 |
0a7b51463cace28e564da1501e2f440a31012daa | 23,188 | cbl | COBOL | Source/ZFAM005.cbl | walmartlabs/zFAM | f57e36adec60c0c03d2fb86cd944b2ce0c43f8f5 | [
"Apache-2.0"
] | 21 | 2018-04-17T15:37:29.000Z | 2021-09-26T20:19:16.000Z | Source/ZFAM005.cbl | wizardofzos/zFAM | f57e36adec60c0c03d2fb86cd944b2ce0c43f8f5 | [
"Apache-2.0"
] | null | null | null | Source/ZFAM005.cbl | wizardofzos/zFAM | f57e36adec60c0c03d2fb86cd944b2ce0c43f8f5 | [
"Apache-2.0"
] | 9 | 2016-12-02T16:08:12.000Z | 2017-10-27T04:07:02.000Z | CBL CICS(SP)
IDENTIFICATION DIVISION.
PROGRAM-ID. ZFAM005.
AUTHOR. Rich Jackson and Randy Frerking
*****************************************************************
* *
* zFAM - z/OS File Access Manager *
* *
* This program is executed via XCTL from ZFAM002 to process *
* an HTTP/GET request with a query string of LE or LT, which *
* is used to 'browse' the table backward one record at a time. *
* *
* *
* Date UserID Description *
* ---------- -------- ----------------------------------------- *
* *
*****************************************************************
ENVIRONMENT DIVISION.
DATA DIVISION.
WORKING-STORAGE SECTION.
*****************************************************************
* DEFINE LOCAL VARIABLES *
*****************************************************************
01 SERVER-CONVERT PIC S9(08) COMP VALUE ZEROES.
01 DOCUMENT-TOKEN PIC X(16) VALUE SPACES.
01 USERID PIC X(08) VALUE SPACES.
01 APPLID PIC X(08) VALUE SPACES.
01 SYSID PIC X(04) VALUE SPACES.
01 ST-CODE PIC X(02) VALUE SPACES.
01 BINARY-ZEROES PIC X(01) VALUE LOW-VALUES.
01 BINARY-ZERO PIC X(01) VALUE X'00'.
01 HEX-01 PIC X(01) VALUE X'01'.
01 HEADER-LASTKEY PIC X(12) VALUE 'zFAM-LastKey'.
01 HEADER-LASTKEY-LENGTH PIC S9(08) COMP VALUE 12.
01 HEADER-ROWS PIC X(09) VALUE 'zFAM-Rows'.
01 HEADER-ROWS-LENGTH PIC S9(08) COMP VALUE 9.
01 MESSAGE-COUNT PIC 9(04) VALUE 1.
01 MESSAGE-COUNT-LENGTH PIC S9(08) COMP VALUE 4.
01 LINKAGE-ADDRESSES.
02 ZFAM-ADDRESS USAGE POINTER.
02 ZFAM-ADDRESS-X REDEFINES ZFAM-ADDRESS
PIC S9(08) COMP.
02 SAVE-ADDRESS USAGE POINTER.
02 SAVE-ADDRESS-X REDEFINES SAVE-ADDRESS
PIC S9(08) COMP.
01 GETMAIN-LENGTH PIC S9(08) COMP VALUE ZEROES.
01 STATUS-LENGTH PIC S9(08) COMP VALUE 255.
01 TRAILING-NULLS PIC S9(08) COMP VALUE 0.
01 TWO-FIFTY-FIVE PIC S9(08) COMP VALUE 255.
01 ONE PIC S9(08) COMP VALUE 1.
01 HTTP-STATUS-200 PIC S9(04) COMP VALUE 200.
01 HTTP-STATUS-201 PIC S9(04) COMP VALUE 201.
01 HTTP-STATUS-204 PIC S9(04) COMP VALUE 204.
01 HTTP-STATUS-400 PIC S9(04) COMP VALUE 400.
01 HTTP-STATUS-401 PIC S9(04) COMP VALUE 401.
01 HTTP-STATUS-503 PIC S9(04) COMP VALUE 503.
01 HTTP-204-TEXT PIC X(24) VALUE SPACES.
01 HTTP-204-LENGTH PIC S9(08) COMP VALUE ZEROES.
01 HTTP-503-TEXT PIC X(24) VALUE SPACES.
01 HTTP-503-LENGTH PIC S9(08) COMP VALUE ZEROES.
01 HTTP-OK PIC X(02) VALUE 'OK'.
01 HTTP-NOT-FOUND PIC X(16) VALUE 'Record not found'.
01 HTTP-NOT-FOUND-LENGTH PIC S9(08) COMP VALUE 16.
01 TEXT-ANYTHING PIC X(04) VALUE 'text'.
01 TEXT-PLAIN PIC X(56) VALUE 'text/plain'.
01 TEXT-HTML PIC X(56) VALUE 'text/html'.
01 APPLICATION-XML PIC X(56) VALUE 'application/xml'.
01 APPLICATION-JSON PIC X(56) VALUE 'application/json'.
01 PROCESS-COMPLETE PIC X(01) VALUE SPACES.
01 FF-SUCCESSFUL PIC X(01) VALUE SPACES.
01 GET-COUNT PIC 9(03) VALUE ZEROES.
01 GET-EQ PIC X(02) VALUE 'eq'.
01 GET-GE PIC X(02) VALUE 'ge'.
01 GET-GT PIC X(02) VALUE 'gt'.
01 GET-LE PIC X(02) VALUE 'le'.
01 GET-LT PIC X(02) VALUE 'lt'.
01 WEB-MEDIA-TYPE PIC X(56).
01 CONTAINER-LENGTH PIC S9(08) COMP VALUE ZEROES.
01 THIRTY-TWO-KB PIC S9(08) COMP VALUE 32000.
01 SEND-ACTION PIC S9(08) COMP VALUE ZEROES.
01 ZFAM-CONTAINER PIC X(16) VALUE 'ZFAM_CONTAINER'.
01 ZFAM-CHANNEL PIC X(16) VALUE 'ZFAM_CHANNEL'.
01 HTML-RESULT PIC X(16) VALUE 'HTML-RESULT '.
01 FC-READ PIC X(07) VALUE 'READ '.
01 CSSL PIC X(04) VALUE '@tdq@'.
01 TD-LENGTH PIC S9(04) VALUE ZEROES COMP.
01 TD-ABS PIC S9(15) VALUE ZEROES COMP-3.
01 TD-RECORD.
02 TD-DATE PIC X(10).
02 FILLER PIC X(01) VALUE SPACES.
02 TD-TIME PIC X(08).
02 FILLER PIC X(01) VALUE SPACES.
02 TD-TRANID PIC X(04).
02 FILLER PIC X(01) VALUE SPACES.
02 TD-MESSAGE PIC X(90) VALUE SPACES.
01 FK-FCT.
02 FK-TRANID PIC X(04) VALUE 'FA##'.
02 FILLER PIC X(04) VALUE 'KEY '.
01 FF-FCT.
02 FF-TRANID PIC X(04) VALUE 'FA##'.
02 FF-DDNAME PIC X(04) VALUE 'FILE'.
01 FK-LENGTH PIC S9(04) COMP VALUE ZEROES.
01 FF-LENGTH PIC S9(04) COMP VALUE ZEROES.
COPY ZFAMFKC.
COPY ZFAMFFC.
01 ZFAM-LENGTH PIC S9(08) COMP VALUE ZEROES.
*****************************************************************
* Dynamic Storage *
*****************************************************************
LINKAGE SECTION.
01 DFHCOMMAREA.
02 GET-CA-TYPE PIC X(02).
02 GET-CA-ROWS PIC 9(04).
02 GET-CA-DELIM PIC X(01).
02 GET-CA-KEYS PIC X(01).
02 GET-CA-TTL PIC X(01).
02 FILLER PIC X(07).
02 GET-CA-KEY-LENGTH PIC S9(08) COMP.
02 GET-CA-KEY PIC X(255).
*****************************************************************
* zFAM message. *
* This is the response message buffer. *
*****************************************************************
01 ZFAM-MESSAGE PIC X(32000).
PROCEDURE DIVISION.
*****************************************************************
* Main process. *
*****************************************************************
PERFORM 1000-INITIALIZE THRU 1000-EXIT.
PERFORM 2000-START-BROWSE THRU 2000-EXIT.
PERFORM 3000-PROCESS-ZFAM THRU 3000-EXIT.
PERFORM 4000-SEND-RESPONSE THRU 4000-EXIT.
PERFORM 9000-RETURN THRU 9000-EXIT.
*****************************************************************
* Perform initialization. *
*****************************************************************
1000-INITIALIZE.
MOVE EIBTRNID(3:2) TO FK-TRANID(3:2).
MOVE EIBTRNID(3:2) TO FF-TRANID(3:2).
1000-EXIT.
EXIT.
*****************************************************************
* The valid GET-CA-TYPE parameters for this program are: *
* LT - Less than *
* LE - Less than or equal *
* *
* Issue Start Browse (STARTBR) using the supplied key. *
* When LE is specified, issue one READPREV, however when LT is *
* specified, the key must be checked to insure that it is less *
* than the key returned on the READPREV command. If the key *
* returned is not less than the key provided, issue another *
* READPREV command. *
*****************************************************************
2000-START-BROWSE.
PERFORM 2100-STARTBR THRU 2100-EXIT.
PERFORM 2200-READPREV THRU 2200-EXIT.
IF GET-CA-TYPE EQUAL GET-LE
IF FK-KEY GREATER GET-CA-KEY
PERFORM 2200-READPREV THRU 2200-EXIT.
IF GET-CA-TYPE EQUAL GET-LT
IF FK-KEY GREATER GET-CA-KEY
OR FK-KEY EQUAL GET-CA-KEY
PERFORM 2200-READPREV THRU 2200-EXIT.
2000-EXIT.
EXIT.
*****************************************************************
* Issue STARTBR file request to the KEY store. *
*****************************************************************
2100-STARTBR.
MOVE GET-CA-KEY TO FK-KEY.
MOVE LENGTH OF FK-RECORD TO FK-LENGTH.
EXEC CICS READ FILE(FK-FCT)
INTO(FK-RECORD)
RIDFLD(FK-KEY)
LENGTH(FK-LENGTH)
GTEQ
NOHANDLE
END-EXEC.
IF EIBRESP NOT EQUAL DFHRESP(NORMAL)
MOVE ZEROES TO STATUS-LENGTH
MOVE ZEROES TO MESSAGE-COUNT
PERFORM 9600-HEADER THRU 9600-EXIT
MOVE HTTP-NOT-FOUND TO HTTP-204-TEXT
MOVE HTTP-NOT-FOUND-LENGTH TO HTTP-204-LENGTH
PERFORM 9700-STATUS-204 THRU 9700-EXIT
PERFORM 9000-RETURN THRU 9000-EXIT.
EXEC CICS STARTBR FILE(FK-FCT)
RIDFLD(FK-KEY)
NOHANDLE
GTEQ
END-EXEC.
IF EIBRESP NOT EQUAL DFHRESP(NORMAL)
MOVE ZEROES TO STATUS-LENGTH
MOVE ZEROES TO MESSAGE-COUNT
PERFORM 9600-HEADER THRU 9600-EXIT
MOVE HTTP-NOT-FOUND TO HTTP-204-TEXT
MOVE HTTP-NOT-FOUND-LENGTH TO HTTP-204-LENGTH
PERFORM 9700-STATUS-204 THRU 9700-EXIT
PERFORM 9000-RETURN THRU 9000-EXIT.
2100-EXIT.
EXIT.
*****************************************************************
* Issue READPREV file request to the KEY store. *
*****************************************************************
2200-READPREV.
MOVE LENGTH OF FK-RECORD TO FK-LENGTH.
EXEC CICS READPREV FILE(FK-FCT)
INTO(FK-RECORD)
RIDFLD(FK-KEY)
LENGTH(FK-LENGTH)
NOHANDLE
END-EXEC.
IF EIBRESP NOT EQUAL DFHRESP(NORMAL)
MOVE ZEROES TO STATUS-LENGTH
MOVE ZEROES TO MESSAGE-COUNT
PERFORM 9600-HEADER THRU 9600-EXIT
MOVE HTTP-NOT-FOUND TO HTTP-204-TEXT
MOVE HTTP-NOT-FOUND-LENGTH TO HTTP-204-LENGTH
PERFORM 9700-STATUS-204 THRU 9700-EXIT
PERFORM 9000-RETURN THRU 9000-EXIT.
2200-EXIT.
EXIT.
*****************************************************************
* Perform the READ process to the FILE/DATA store. *
*****************************************************************
3000-PROCESS-ZFAM.
PERFORM 3100-READ-PROCESS THRU 3100-EXIT
WITH TEST AFTER
UNTIL PROCESS-COMPLETE EQUAL 'Y'.
3000-EXIT.
EXIT.
*****************************************************************
* At this point, the KEY store has already been set by the *
* STARTBR and one or more REDPREV commands. *
* *
* Read the FILE/DATA store, which contains the zFAM record *
* segments. *
*****************************************************************
3100-READ-PROCESS.
MOVE 'Y' TO PROCESS-COMPLETE.
PERFORM 3300-READ-FILE THRU 3300-EXIT.
IF FF-SUCCESSFUL EQUAL 'Y'
PERFORM 3400-STAGE THRU 3400-EXIT.
3100-EXIT.
EXIT.
*****************************************************************
* Read FILE/DATA store record segment(s). *
*****************************************************************
3300-READ-FILE.
MOVE 'Y' TO FF-SUCCESSFUL.
MOVE FK-DDNAME TO FF-DDNAME.
MOVE FK-FF-KEY TO FF-KEY.
MOVE ZEROES TO FF-ZEROES.
MOVE LENGTH OF FF-RECORD TO FF-LENGTH.
MOVE ONE TO FF-SEGMENT.
EXEC CICS READ FILE(FF-FCT)
INTO(FF-RECORD)
RIDFLD(FF-KEY-16)
LENGTH(FF-LENGTH)
NOHANDLE
END-EXEC.
IF EIBRESP NOT EQUAL DFHRESP(NORMAL)
MOVE 'N' TO PROCESS-COMPLETE
MOVE 'N' TO FF-SUCCESSFUL.
3300-EXIT.
EXIT.
*****************************************************************
* Issue GETMAIN only when multiple segments. *
* When the logical record is a single segment, set the *
* ZFAM-MESSAGE buffer in the LINKAGE SECTION to the record *
* buffer address. *
*****************************************************************
3400-STAGE.
IF FF-SEGMENT EQUAL ZEROES
MOVE ONE TO FF-SEGMENT.
IF FF-SEGMENTS EQUAL ONE
SUBTRACT FF-PREFIX FROM FF-LENGTH
SET ADDRESS OF ZFAM-MESSAGE TO ADDRESS OF FF-DATA.
IF FF-SEGMENTS GREATER THAN ONE
MULTIPLY FF-SEGMENTS BY THIRTY-TWO-KB
GIVING GETMAIN-LENGTH
EXEC CICS GETMAIN SET(ZFAM-ADDRESS)
FLENGTH(GETMAIN-LENGTH)
INITIMG(BINARY-ZEROES)
NOHANDLE
END-EXEC
SET ADDRESS OF ZFAM-MESSAGE TO ZFAM-ADDRESS
MOVE ZFAM-ADDRESS-X TO SAVE-ADDRESS-X
SUBTRACT FF-PREFIX FROM FF-LENGTH
MOVE FF-DATA(1:FF-LENGTH) TO ZFAM-MESSAGE
ADD FF-LENGTH TO ZFAM-ADDRESS-X.
ADD ONE TO FF-SEGMENT.
MOVE FF-LENGTH TO ZFAM-LENGTH.
IF FF-SEGMENTS GREATER THAN ONE
PERFORM 3500-READ-SEGMENTS THRU 3500-EXIT
WITH TEST AFTER
UNTIL FF-SEGMENT GREATER THAN FF-SEGMENTS
OR FF-SUCCESSFUL EQUAL 'N'.
3400-EXIT.
EXIT.
*****************************************************************
* Read FILE/DATA store record segments. *
*****************************************************************
3500-READ-SEGMENTS.
SET ADDRESS OF ZFAM-MESSAGE TO ZFAM-ADDRESS.
MOVE LENGTH OF FF-RECORD TO FF-LENGTH.
EXEC CICS READ FILE(FF-FCT)
INTO(FF-RECORD)
RIDFLD(FF-KEY-16)
LENGTH(FF-LENGTH)
NOHANDLE
END-EXEC.
IF EIBRESP EQUAL DFHRESP(NORMAL)
SUBTRACT FF-PREFIX FROM FF-LENGTH
MOVE FF-DATA(1:FF-LENGTH) TO ZFAM-MESSAGE
ADD FF-LENGTH TO ZFAM-ADDRESS-X
ADD ONE TO FF-SEGMENT
ADD FF-LENGTH TO ZFAM-LENGTH
ELSE
MOVE 'N' TO PROCESS-COMPLETE
MOVE 'N' TO FF-SUCCESSFUL
PERFORM 3510-FREEMAIN THRU 3510-EXIT.
3500-EXIT.
EXIT.
*****************************************************************
* FREEMAIN message segment buffer. *
* This is required to reprocess a READ request when a KEY store *
* record has performed an internal key swap for the FILE/DATA *
* store record on an UPDATE (PUT). *
*****************************************************************
3510-FREEMAIN.
EXEC CICS FREEMAIN
DATAPOINTER(SAVE-ADDRESS)
NOHANDLE
END-EXEC.
3510-EXIT.
EXIT.
*****************************************************************
* Send zFAM record. *
*****************************************************************
4000-SEND-RESPONSE.
IF FF-SEGMENTS EQUAL ONE
SET ADDRESS OF ZFAM-MESSAGE TO ADDRESS OF FF-DATA.
IF FF-SEGMENTS GREATER THAN ONE
SET ADDRESS OF ZFAM-MESSAGE TO SAVE-ADDRESS.
MOVE FF-MEDIA TO WEB-MEDIA-TYPE.
IF WEB-MEDIA-TYPE EQUAL SPACES
MOVE TEXT-PLAIN TO WEB-MEDIA-TYPE.
MOVE DFHVALUE(IMMEDIATE) TO SEND-ACTION.
INSPECT WEB-MEDIA-TYPE
REPLACING ALL SPACES BY LOW-VALUES.
INSPECT FUNCTION REVERSE(FK-KEY)
TALLYING TRAILING-NULLS
FOR LEADING LOW-VALUES.
SUBTRACT TRAILING-NULLS FROM LENGTH OF FK-KEY
GIVING STATUS-LENGTH.
PERFORM 9600-HEADER THRU 9600-EXIT.
IF WEB-MEDIA-TYPE(1:04) EQUAL TEXT-ANYTHING
OR WEB-MEDIA-TYPE(1:15) EQUAL APPLICATION-XML
OR WEB-MEDIA-TYPE(1:16) EQUAL APPLICATION-JSON
MOVE DFHVALUE(SRVCONVERT) TO SERVER-CONVERT
ELSE
MOVE DFHVALUE(NOSRVCONVERT) TO SERVER-CONVERT.
EXEC CICS WEB SEND
FROM (ZFAM-MESSAGE)
FROMLENGTH(ZFAM-LENGTH)
MEDIATYPE (WEB-MEDIA-TYPE)
STATUSCODE(HTTP-STATUS-200)
STATUSTEXT(FK-KEY)
STATUSLEN (STATUS-LENGTH)
ACTION (SEND-ACTION)
SERVERCONV(SERVER-CONVERT)
NOHANDLE
END-EXEC.
4000-EXIT.
EXIT.
*****************************************************************
* Return to CICS *
*****************************************************************
9000-RETURN.
EXEC CICS RETURN
END-EXEC.
9000-EXIT.
EXIT.
*****************************************************************
* Write an HTTP header containing the LastKey and Rows. *
*****************************************************************
9600-HEADER.
EXEC CICS WEB WRITE
HTTPHEADER (HEADER-LASTKEY)
NAMELENGTH (HEADER-LASTKEY-LENGTH)
VALUE (FK-KEY)
VALUELENGTH(STATUS-LENGTH)
NOHANDLE
END-EXEC.
EXEC CICS WEB WRITE
HTTPHEADER (HEADER-ROWS)
NAMELENGTH (HEADER-ROWS-LENGTH)
VALUE (MESSAGE-COUNT)
VALUELENGTH(MESSAGE-COUNT-LENGTH)
NOHANDLE
END-EXEC.
9600-EXIT.
EXIT.
*****************************************************************
* Status 204 response. *
*****************************************************************
9700-STATUS-204.
EXEC CICS DOCUMENT CREATE DOCTOKEN(DOCUMENT-TOKEN)
NOHANDLE
END-EXEC.
MOVE DFHVALUE(IMMEDIATE) TO SEND-ACTION.
EXEC CICS WEB SEND
DOCTOKEN(DOCUMENT-TOKEN)
MEDIATYPE(TEXT-PLAIN)
SRVCONVERT
NOHANDLE
ACTION(SEND-ACTION)
STATUSCODE(HTTP-STATUS-204)
STATUSTEXT(HTTP-204-TEXT)
STATUSLEN (HTTP-204-LENGTH)
END-EXEC.
9700-EXIT.
EXIT.
*****************************************************************
* Write TD CSSL. *
*****************************************************************
9900-WRITE-CSSL.
PERFORM 9950-ABS THRU 9950-EXIT.
MOVE EIBTRNID TO TD-TRANID.
EXEC CICS FORMATTIME ABSTIME(TD-ABS)
TIME(TD-TIME)
YYYYMMDD(TD-DATE)
TIMESEP
DATESEP
NOHANDLE
END-EXEC.
MOVE LENGTH OF TD-RECORD TO TD-LENGTH.
EXEC CICS WRITEQ TD QUEUE(CSSL)
FROM(TD-RECORD)
LENGTH(TD-LENGTH)
NOHANDLE
END-EXEC.
9900-EXIT.
EXIT.
*****************************************************************
* Get Absolute time. *
*****************************************************************
9950-ABS.
EXEC CICS ASKTIME ABSTIME(TD-ABS) NOHANDLE
END-EXEC.
9950-EXIT.
EXIT.
| 41.555556 | 72 | 0.381232 |
1c3386e72b0e82d75c0340fd20f7409c1e51bd0f | 2,506 | cob | COBOL | languages/cobol/cobol24/ch22/chapt22x.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 34 | 2016-10-29T19:50:34.000Z | 2022-02-12T21:27:43.000Z | languages/cobol/cobol24/ch22/chapt22x.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | null | null | null | languages/cobol/cobol24/ch22/chapt22x.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 19 | 2017-06-19T23:04:00.000Z | 2021-11-13T15:00:41.000Z | 000010 @OPTIONS MAIN,TEST
000020 Identification Division.
000030 Program-Id. Chapt22x.
000031*chapter 22 Exercise Solution
000041 Environment Division.
000050 Configuration Section.
000051 Source-Computer. IBM-PC.
000055 Object-Computer. IBM-PC.
000056 Data Division.
000057 Working-Storage Section.
000058 01 Random-Seed Pic 9(8) Value Zeros.
000059 01 Counter Pic 9(4) Value Zeros.
000069 01 Random-Number-Table.
000079 03 Random-Number Pic 9(4) Occurs 3000 Times.
000089 01 Random-Generate Pic V9(18) Value Zeros.
000090 01 Result Pic 9(5)v9(4) Value Zeros.
000099 01 Ed-Result Pic ZZ,ZZZ.9999.
000148 Procedure Division.
000159 Chapt22x-Start.
000160 Display "Starting Random Number Generation"
000161 Move Function Current-Date (11:8) To Random-Seed
000162 Compute Random-Generate = Function Random (Random-Seed)
000163 Compute Random-Number (1) =
000164 (Random-Generate * 1000) + 1
000165 Perform Varying Counter From 2 By 1
000166 Until Counter > 3000
000167 Compute Random-Generate = Function Random
000168 Compute Random-Number (Counter) =
000169 (Random-Generate * 1000) + 1
000170 End-Perform
000171 Display "Random Number Generation Complete"
000172 Compute Result = Function Min (Random-Number (All))
000173 Move Result To Ed-Result
000174 Display "Min=" Ed-Result
000175 Compute Result = Function Max (Random-Number (All))
000176 Move Result To Ed-Result
000177 Display "Max=" Ed-Result
000178 Compute Result = Function Mean (Random-Number (All))
000179 Move Result To Ed-Result
000180 Display "Mean=" Ed-Result
000181 Compute Result = Function Median (Random-Number (All))
000182 Move Result To Ed-Result
000183 Display "Median=" Ed-Result
000184 Compute Result = Function Midrange (Random-Number (All))
000185 Move Result To Ed-Result
000186 Display "Midrange=" Ed-Result
000187 Compute Result = Function Range (Random-Number (All))
000188 Move Result To Ed-Result
000189 Display "Range=" Ed-Result
000190 Compute Result = Function Variance (Random-Number (All))
000191 Move Result To Ed-Result
000192 Display "Variance=" Ed-Result
000193 Compute Result = Function
000194 Standard-Deviation (Random-Number (All))
000195 Move Result To Ed-Result
000196 Display "Standard Deviation=" Ed-Result
000197 Stop Run
000198 .
| 43.206897 | 67 | 0.704709 |
f98aba519b898bedcbb7c9aa353e2c87874e0b4d | 321 | cbl | COBOL | src/test/resources/io/proleap/cobol/preprocessor/variable/IdentificationDivision.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 81 | 2018-03-29T23:39:01.000Z | 2022-03-07T11:23:10.000Z | src/test/resources/io/proleap/cobol/preprocessor/variable/IdentificationDivision.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 64 | 2017-03-27T11:15:15.000Z | 2018-03-09T18:10:43.000Z | src/test/resources/io/proleap/cobol/preprocessor/variable/IdentificationDivision.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 44 | 2019-01-03T11:48:54.000Z | 2021-12-21T09:46:42.000Z | 000100 IDENTIFICATION DIVISION.
000200 PROGRAM-ID.
000300 CONFIGSECTION.
000400 AUTHOR.
000500 SOMEAUTH.
000600 INSTALLATION.
000700 SOMEINSTALL.
000800 DATE-COMPILED.
000900 SOMECOMPILED.
001000 DATE-WRITTEN.
001100 SOMEWRITTEN.
001200 SECURITY.
001300 SOMESEC.
001400 REMARKS.
001500 SOMEREM. | 21.4 | 31 | 0.766355 |
ca7cbdc10fc7956ce77d9cc1ad827e9b2cda5b21 | 420 | cbl | COBOL | controllers/index.cbl | dln/cobol-on-wheelchair | 04924f9ded6ef08337fa6e86297e73c64c072d4c | [
"MIT"
] | 642 | 2015-01-09T17:30:13.000Z | 2022-03-01T21:06:28.000Z | controllers/index.cbl | Seanpm2001-education/cobol-on-wheelchair | b9a37ed1b5d00ccabc34081e9de6dc18299d8713 | [
"MIT"
] | 14 | 2015-04-23T03:41:44.000Z | 2021-11-12T01:23:05.000Z | controllers/index.cbl | Seanpm2001-education/cobol-on-wheelchair | b9a37ed1b5d00ccabc34081e9de6dc18299d8713 | [
"MIT"
] | 45 | 2015-10-10T05:57:14.000Z | 2021-12-18T23:35:57.000Z |
identification division.
program-id. indexweb.
data division.
working-storage section.
01 the-vars.
03 COW-vars OCCURS 99 times.
05 COW-varname pic x(99).
05 COW-varvalue pic x(99).
procedure division.
call 'template' using the-vars "index.cow".
goback.
end program indexweb.
| 16.153846 | 54 | 0.507143 |
f0fde6cbf4cc502bd42a4f033621b53b8448b242 | 3,604 | cpy | COBOL | server/src/test/resources/implicitCopybooks/SQLCA_DATACOM.cpy | SWETAS04/che-che4z-lsp-for-cobol | d2960660d4ef85198a0ced82d997788e7046d98f | [
"Apache-2.0"
] | 36 | 2019-08-30T07:50:48.000Z | 2022-03-24T10:07:31.000Z | server/src/test/resources/implicitCopybooks/SQLCA_DATACOM.cpy | SWETAS04/che-che4z-lsp-for-cobol | d2960660d4ef85198a0ced82d997788e7046d98f | [
"Apache-2.0"
] | 819 | 2019-08-22T14:52:23.000Z | 2022-03-31T14:10:10.000Z | server/src/test/resources/implicitCopybooks/SQLCA_DATACOM.cpy | SWETAS04/che-che4z-lsp-for-cobol | d2960660d4ef85198a0ced82d997788e7046d98f | [
"Apache-2.0"
] | 47 | 2019-08-22T14:30:41.000Z | 2022-03-31T13:41:17.000Z | * Copyright (c) 2021 Broadcom.
* The term "Broadcom" refers to Broadcom Inc. and/or its subsidiaries.
*
* This program and the accompanying materials are made
* available under the terms of the Eclipse Public License 2.0
* which is available at https://www.eclipse.org/legal/epl-2.0/
*
* SPDX-License-Identifier: EPL-2.0
*
* Contributors:
* Broadcom, Inc. - initial API and implementation
01 {$*SQLCA}.
05 {$*SQLCA-EYE-CATCH} PIC X(08).
05 {$*SQLCAID} REDEFINES {$SQLCA-EYE-CATCH}
PIC X(08).
05 {$*SQLCA-LEN} PIC S9(9) COMP.
05 {$*SQLCABC} REDEFINES {$SQLCA-LEN}
PIC S9(9) COMP.
05 {$*SQLCA-DB-VRS} PIC X(02).
05 {$*SQLCA-DB-RLS} PIC X(02).
05 {$*SQLCA-LUWID} PIC X(08).
05 {$*SQLCA-SQLCODE} PIC S9(9) COMP.
05 {$*SQLCA-ERROR-INFO}.
10 {$*SQLCA-ERR-LEN} PIC S9(4) COMP.
10 {$*SQLCA-ERR-MSG} PIC X(80).
05 {$*SQLERRM} REDEFINES {$SQLCA-ERROR-INFO}.
10 {$*SQLERRML} PIC S9(4) COMP.
10 {$*SQLERRMC} PIC X(70).
10 {$*SQLERRMF} PIC X(10).
05 {$*SQLCA-ERROR-PGM} PIC X(08).
05 {$*SQLERRP} REDEFINES {$SQLCA-ERROR-PGM}
PIC X(08).
05 {$*SQLCA-FILLER-1} PIC X(02).
05 {$*SQLCA-ERROR-DATA}.
10 {$*SQLCA-DSFCODE} PIC X(04).
10 {$*SQLCA-INFCODE} PIC S9(9) COMP.
10 {$*SQLCA-DBCODE}.
15 {$*SQLCA-DBCODE-EXT} PIC X(02).
15 {$*SQLCA-DBCODE-INT} PIC S9(4) COMP.
10 {$*SQLCA-MISC-CODE1} PIC S9(9) COMP.
10 {$*SQLCA-MISC-CODES-B}.
15 {$*SQLCA-MISC-CODE2} PIC S9(9) COMP.
15 {$*SQLCA-MISC-CODE3} PIC S9(9) COMP.
10 {$*SQLCA-ERR-INFO-2} REDEFINES
{$SQLCA-MISC-CODES-B}.
15 {$*SQLCA-SQLSTATE} PIC X(05).
15 {$*SQLCA-FILLER-2} PIC X(03).
05 {$*SQLCA-WRN-AREA}.
10 {$*SQLCA-WARNING} PIC X OCCURS 8 TIMES.
05 {$*SQLWARN} REDEFINES {$SQLCA-WRN-AREA} PIC X.
10 {$*SQLWARN0} PIC X.
10 {$*SQLWARN1} PIC X.
10 {$*SQLWARN2} PIC X.
10 {$*SQLWARN3} PIC X.
10 {$*SQLWARN4} PIC X.
10 {$*SQLWARN5} PIC X.
10 {$*SQLWARN6} PIC X.
10 {$*SQLWARN7} PIC X.
05 {$*SQLCA-PGM-NAME} PIC X(08).
05 {$*SQLCA-AUTHID} PIC X(18).
05 {$*SQLCA-PLAN-NAME} PIC X(18).
| 44.493827 | 76 | 0.348779 |
6babfc8b521c29eea9f202a3524848b781e13775 | 514 | cob | COBOL | 09_condition_statements_04.cob | tseiiti/cobol | c1817d7e254c3a7dfc73a3b21c7f4263c4984f7b | [
"MIT"
] | null | null | null | 09_condition_statements_04.cob | tseiiti/cobol | c1817d7e254c3a7dfc73a3b21c7f4263c4984f7b | [
"MIT"
] | null | null | null | 09_condition_statements_04.cob | tseiiti/cobol | c1817d7e254c3a7dfc73a3b21c7f4263c4984f7b | [
"MIT"
] | null | null | null | identification division.
program-id. condition_statements_04.
data division.
working-storage section.
01 ws-num1 pic x(9) value 'abcd '.
01 ws-num2 pic 9(9) value 123456789.
procedure division.
a000-first-para.
if ws-num1 is alphabetic then
display 'ws-num1 is alphabetic'.
if ws-num1 is numeric then
display 'ws-num1 is numeric'.
if ws-num2 is numeric then
display 'ws-num2 is numeric'.
stop run.
| 24.47619 | 43 | 0.599222 |
ad22b8fdb3d124fef98347a0b83ee5ad951325e2 | 2,945 | cob | COBOL | test/data/COBOL-68/mccracken3.cob | jfitz/code-stat | dd2a13177f3ef03ab42123ef3cfcbbd062a2ae26 | [
"MIT"
] | null | null | null | test/data/COBOL-68/mccracken3.cob | jfitz/code-stat | dd2a13177f3ef03ab42123ef3cfcbbd062a2ae26 | [
"MIT"
] | null | null | null | test/data/COBOL-68/mccracken3.cob | jfitz/code-stat | dd2a13177f3ef03ab42123ef3cfcbbd062a2ae26 | [
"MIT"
] | null | null | null | PROCEDURE DIVISION.
MAIN-LINE-ROUTINE.
PERFORM 1A-HOUSEKEEPING.
PERFORM 1B-PROCESS-INPUT
UNTIL END-OF-FILE.
PERFORM 1C-PRINT-TABLE.
PERFORM 1D-WRAPUP.
STOP RUN.
********** FIRST-LEVEL PERFORMED ROUTINES
1A-HOUSEKEEPING.
OPEN INPUT EMP-MASTER-CARD-IN
OUTPUT PRINT-FILE.
MOVE LOW-VALUES TO STAT-TABLE.
1B-PROCESS-INPUT.
PERFORM 2B1-READ-INPUT.
IF NOT END-OF-FILE
PERFORM 2B2-SEARCH-AND-TALLY.
1C-PRINT-TABLE.
PERFORM 2C2-PRINT-UPPER-HEADER.
PERFORM 2C1-PRINT-TABLE-ROW VARYING ROW-INDEX FROM 1 BY 1
UNTIL ROW-INDEX > 9.
PERFORM 2CS-PRINT-LOWER-HEADER.
PERFORM 2C1-PRINT-TABLE-ROW VARYING ROW-INDEX FROM 10 BY 1
UNTIL ROW-INDEX > 18.
1D-WRAPUP.
CLOSE EMP-MASTER-CARD-IN
PRINT-FILE.
******** SECOND-LEVEL PERFORMED ROUTINES
2B1-READ-INPUT.
READ EMP-MASTER-CARD-IN
AT END MOVE 'X' TO END-OF-FILE-FLAG.
2B2-SEARCH-AND-TALLY.
SET AGE-INDEX ROW-INDEX TO 1.
SEARCH AGE-TABLE VARYING ROW-INDEX
WHEN AGE < AGE-TABLE (AGE-INDEX) NEXT SENTENCE.
SET LOS-INDEX COL-INDEX TO 1.
SEARCH LOS-TABLE VARYING COL-INDEX
WHEN LOS < LOS-TABLE (LOS-INDEX) NEXT SENTENCE.
IF FEMALE SET COL-INDEX UP BY 8.
IF NON-MGT SET ROW-INDEX UP BY 9.
ADD 1 TO STAT (ROW-INDEX, COL-INDEX).
2C1-PRINT-TABLE-ROW.
PERFORM 3CIA-FILL-BUCKETS VARYING COL-INDEX FROM 1 BY 1
UNTIL COL-INDEX > 16.
SET ROW-IDENT-INDEX TO ROW-INDEX.
MOVE ROW-IDENT (ROW-IDENT-INDEX) TO ROW-IDENT-OUT.
WRITE PRINT-RECORD FROM TEMP-AREA AFTER ADVANCING 1 LINES.
2C2-PRINT-UPPER-HEADER.
MOVE HEADER-1 TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING NEW-PAGE.
MOVE HEADER-2 TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING 2 LINES.
MOVE HEADER-3 TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING 2 LINES.
MOVE HEADER-4 TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING 2 LINES.
MOVE ' AGE' TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING 2 LINES.
MOVE SPACES TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING 1 LINES.
2C3-PRINT-LOWER-HEADER.
MOVE HEADER-5 TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING 2 LINES.
MOVE SPACES TO PRINT-LINE.
WRITE PRINT-RECORD AFTER ADVANCING 1 LINES.
********** THIRD LEVEL PERFORMED ROUTINE **********
3C1A-FILL-BUCKETS.
SET BUCKET-INDEX TO COL-INDEX.
MOVE STAT (ROW-INDEX, COL-INDEX) TO BUCKET (BUCKET-INDEX).
| 36.358025 | 70 | 0.566044 |
ac5d34e5aa0984d08bfeba1ddac66263455ec734 | 1,020 | cob | COBOL | example11/example11.cob | ursinn/COBOL-Hello | 21ed6efac6199c3f0d53dbc2157d633a54daf400 | [
"Unlicense"
] | null | null | null | example11/example11.cob | ursinn/COBOL-Hello | 21ed6efac6199c3f0d53dbc2157d633a54daf400 | [
"Unlicense"
] | 1 | 2021-02-13T16:55:08.000Z | 2021-02-13T16:55:08.000Z | example11/example11.cob | ursinn/cobol-hello | c6ee308d2066233c110d781044a5ff0e45d4547a | [
"Unlicense"
] | null | null | null | >>SOURCE FORMAT FREE
IDENTIFICATION DIVISION.
PROGRAM-ID. example11.
AUTHOR. Ursin Filli
DATE-WRITTEN. April 30th 2020
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT CustomerFile ASSIGN TO "Customer.dat"
ORGANIZATION IS LINE SEQUENTIAL
ACCESS IS SEQUENTIAL.
DATA DIVISION.
FILE SECTION.
FD CustomerFile.
01 CustomerData.
02 IDNum PIC 9(5).
02 CustName.
03 FirstName PIC X(15).
03 LastName PIC X(15).
WORKING-STORAGE SECTION.
01 WSCustomer.
02 WSIDNum PIC 9(5).
02 WSCustName.
03 WSFirstName PIC X(15).
03 WSLastName PIC X(15).
PROCEDURE DIVISION.
OPEN EXTEND CustomerFile.
DISPLAY "Customer ID " WITH NO ADVANCING
ACCEPT IDNum
DISPLAY "Customer First Name " WITH NO ADVANCING
ACCEPT FirstName
DISPLAY "Customer Last Name " WITH NO ADVANCING
ACCEPT LastName
WRITE CustomerData
END-WRITE.
CLOSE CustomerFile.
STOP RUN.
| 24.878049 | 55 | 0.652941 |
42aea4b0d425ed26f799d7be6b44d57856306547 | 1,501 | cbl | COBOL | TIPOSDEDATOS.cbl | neomatrixcode/curso-COBOL | 99faf59f887e0f05364ed49920db48e5ad9def72 | [
"CNRI-Python"
] | null | null | null | TIPOSDEDATOS.cbl | neomatrixcode/curso-COBOL | 99faf59f887e0f05364ed49920db48e5ad9def72 | [
"CNRI-Python"
] | null | null | null | TIPOSDEDATOS.cbl | neomatrixcode/curso-COBOL | 99faf59f887e0f05364ed49920db48e5ad9def72 | [
"CNRI-Python"
] | null | null | null | * los tipos de datos en cobol se especifican con la instruccion
* PIC (picture clause)
* los simbolos utilizados para definir el dato son:
* 9 Valor Numérico
* A Orden alfabético
* X Alfanumérico
* V Decimal implícito
* S Signo
* P Decimal asumido
IDENTIFICATION DIVISION.
PROGRAM-ID. TIPOSDEDATOS.
DATA DIVISION.
WORKING-STORAGE SECTION.
* double NUM1-WS = 3.5
77 NUM1-WS PIC 99V9 VALUE IS 32.5.
77 NUM2-WS PIC S9V9 VALUE IS -6.2.
* string DATO-TEXTO = "HOLA MUNDO"
* el numero indicado entre parentesis indica el numero de veces que se repetira
* el simbolo de definicion de datos, por defecto su valor es (1)
77 DATO-TEXTO PIC A(10) VALUE 'HOLA MUNDO'.
77 DATO-TEXTO2 PIC X(10) VALUE 'H0La_MU#DO'.
* int DATO-ID = 00
77 DATO-ID PIC 99 VALUE ZERO.
77 HORAS PIC 9.
77 PAGO PIC 9(3).
77 SALARIO PIC 9(5).
PROCEDURE DIVISION.
DISPLAY "NUM1-WS : "NUM1-WS.
DISPLAY "NUM2-WS : "NUM2-WS.
DISPLAY "DATO-TEXTO : "DATO-TEXTO.
DISPLAY "DATO-TEXTO2 : "DATO-TEXTO2.
DISPLAY "DATO-ID : "DATO-ID.
* HORAS = 8
MOVE 8 TO HORAS.
MOVE 100 TO PAGO.
* calculo del salario
COMPUTE SALARIO = HORAS * PAGO
* impresion en pantalla del salario
DISPLAY "SALARIO = "SALARIO
STOP RUN.
| 34.906977 | 85 | 0.566955 |
042c1d8a76adcb08a18d10f254b48f948ce4a923 | 350 | cbl | COBOL | config.cbl | mkljczk/cobol-on-wheelchair | 836abf462c60867480d02d8dd4894bd175345eca | [
"MIT"
] | null | null | null | config.cbl | mkljczk/cobol-on-wheelchair | 836abf462c60867480d02d8dd4894bd175345eca | [
"MIT"
] | null | null | null | config.cbl | mkljczk/cobol-on-wheelchair | 836abf462c60867480d02d8dd4894bd175345eca | [
"MIT"
] | null | null | null | move "/" to routing-pattern(1).
move "indexweb" to routing-destiny(1).
move "/showsum/%value1/%value2" to routing-pattern(2).
move "showsum" to routing-destiny(2).
move "/showname/%value" to routing-pattern(3).
move "showname" to routing-destiny(3).
| 38.888889 | 57 | 0.517143 |
b8283692d190417b086ac4ce5949e547e9a0985e | 27 | cob | COBOL | checker/punchy_mc_lochface/sql.cob | fausecteam/faustctf-2019-punchy | c68d80ff2c57e45c8c4ef8d6ed65b73efc41cfe0 | [
"0BSD"
] | null | null | null | checker/punchy_mc_lochface/sql.cob | fausecteam/faustctf-2019-punchy | c68d80ff2c57e45c8c4ef8d6ed65b73efc41cfe0 | [
"0BSD"
] | null | null | null | checker/punchy_mc_lochface/sql.cob | fausecteam/faustctf-2019-punchy | c68d80ff2c57e45c8c4ef8d6ed65b73efc41cfe0 | [
"0BSD"
] | null | null | null | = 1; SELECT * FROM DATA; -- | 27 | 27 | 0.555556 |
5063dacaa77ec5d88c91e80afd88021347e25c71 | 735 | cob | COBOL | mt9x9.cob | bluebat/mt9x9 | 0758ed7bba325ecc3a08a919ea7f38f6b9795306 | [
"Unlicense"
] | null | null | null | mt9x9.cob | bluebat/mt9x9 | 0758ed7bba325ecc3a08a919ea7f38f6b9795306 | [
"Unlicense"
] | null | null | null | mt9x9.cob | bluebat/mt9x9 | 0758ed7bba325ecc3a08a919ea7f38f6b9795306 | [
"Unlicense"
] | 1 | 2019-06-01T07:12:12.000Z | 2019-06-01T07:12:12.000Z | *> 9x9 multiplication table in COBOL
*> CC0, Wei-Lun Chao <[email protected]>, 2018.
*> cobc -Fx mt9x9.cob && ./mt9x9 || cobc -Fxj mt9x9.cob
identification division.
program-id. mt9x9.
data division.
working-storage section.
01 i pic 9.
01 j pic 9.
01 k pic 9.
01 l pic 9.
01 kj pic z9.
procedure division.
perform varying i from 0 by 3 until i greater than 8
perform with test after varying j from 1 by 1 until j equal 9
perform varying l from 1 by 1 until l greater than 3
add i l giving k
multiply k by j giving kj
display k "x" j "=" kj x"09" with no advancing
end-perform
display x"0a" with no advancing
end-perform
display x"00"
end-perform
stop run.
| 27.222222 | 65 | 0.661224 |
c5ddf2d9dd610fa156324c7e505b1853849c5cdf | 1,425 | cpy | COBOL | middleware/binding/cobol/copy/TXINFDEF.cpy | casualcore/casual | 047a4eaabbba52ad3ce63dc698a9325ad5fcec6d | [
"MIT"
] | null | null | null | middleware/binding/cobol/copy/TXINFDEF.cpy | casualcore/casual | 047a4eaabbba52ad3ce63dc698a9325ad5fcec6d | [
"MIT"
] | null | null | null | middleware/binding/cobol/copy/TXINFDEF.cpy | casualcore/casual | 047a4eaabbba52ad3ce63dc698a9325ad5fcec6d | [
"MIT"
] | 1 | 2022-02-21T18:30:25.000Z | 2022-02-21T18:30:25.000Z | * X/Open CAE Specification
* Distributed Transaction Processing:
* The TX (Transaction Demarcation) Specification
* ISBN: 1-85912-094-6
* X/Open Document Number: C504
*
* TXINFDEF.cpy
*
* XID record
05 XID-REC.
10 FORMAT-ID PIC S9(9) COMP-5.
* A value of -1 in FORMAT-ID means that the XID is null
10 GTRID-LENGTH PIC S9(9) COMP-5.
10 BRANCH-LENGTH PIC S9(9) COMP-5.
10 XID-DATA PIC X(128).
* Transaction mode settings
05 TRANSACTION-MODE PIC S9(9) COMP-5.
88 TX-NOT-IN-TRAN VALUE 0.
88 TX-IN-TRAN VALUE 1.
* Commit_return settings
05 COMMIT-RETURN PIC S9(9) COMP-5.
88 TX-COMMIT-COMPLETED VALUE 0.
88 TX-COMMIT-DECISION-LOGGED VALUE 1.
* Transaction_control settings
05 TRANSACTION-CONTROL PIC S9(9) COMP-5.
88 TX-UNCHAINED VALUE 0.
88 TX-CHAINED VALUE 1.
* Transaction_timeout value
05 TRANSACTION-TIMEOUT PIC S9(9) COMP-5.
88 NO-TIMEOUT VALUE 0.
* Transaction_state information
05 TRANSACTION-STATE PIC S9(9) COMP-5.
88 TX-ACTIVE VALUE 0.
88 TX-TIMEOUT-ROLLBACK-ONLY VALUE 1.
88 TX-ROLLBACK-ONLY VALUE 2.
| 36.538462 | 61 | 0.534035 |
6c5434b6c2bab4cd7debfc405db06ddb5537866f | 278 | cob | COBOL | scripts/towns.cob | bencollieruk/cobol-api | 6bc5675fcb5226b8f75cc9ec9d1f50229a6e6131 | [
"Apache-2.0"
] | 2 | 2019-03-14T11:12:02.000Z | 2021-12-25T03:59:02.000Z | scripts/towns.cob | bmcollier/cobol-api | 6bc5675fcb5226b8f75cc9ec9d1f50229a6e6131 | [
"Apache-2.0"
] | null | null | null | scripts/towns.cob | bmcollier/cobol-api | 6bc5675fcb5226b8f75cc9ec9d1f50229a6e6131 | [
"Apache-2.0"
] | 1 | 2020-01-14T03:18:35.000Z | 2020-01-14T03:18:35.000Z | identification division.
program-id. towns.
environment division.
input-output section.
data division.
working-storage section.
01 newline pic x value x'0a'.
procedure division.
display
'{"name": 1, "age": 2, "sex": 3}'
end-display.
end program towns.
| 14.631579 | 46 | 0.679856 |
e842168240bd4816298f9a606f7a9b0309a900bf | 2,003 | cob | COBOL | AdventOfCode2021/d17b.cob | GaloisGirl/Coding | 24870ff58c3e5c155547276f7a6fd3e613f60b5e | [
"MIT"
] | 13 | 2020-12-11T23:07:24.000Z | 2021-12-27T23:58:22.000Z | AdventOfCode2021/d17b.cob | GaloisGirl/Coding | 24870ff58c3e5c155547276f7a6fd3e613f60b5e | [
"MIT"
] | 1 | 2020-12-20T22:16:33.000Z | 2021-08-17T16:54:08.000Z | AdventOfCode2021/d17b.cob | GaloisGirl/Coding | 24870ff58c3e5c155547276f7a6fd3e613f60b5e | [
"MIT"
] | 2 | 2020-12-20T22:02:08.000Z | 2021-12-23T14:42:07.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. AOC-2021-17-2.
AUTHOR. ANNA KOSIERADZKA.
* Note: this one takes several minutes
DATA DIVISION.
WORKING-STORAGE SECTION.
77 X1 PIC S9(6) VALUE 56.
77 X2 PIC S9(6) VALUE 76.
77 Y1 PIC S9(6) VALUE -162.
77 Y2 PIC S9(6) VALUE -134.
77 X PIC S9(6) VALUE 0.
77 Y PIC S9(6) VALUE 0.
77 I PIC S9(6) VALUE 0.
77 J PIC S9(6) VALUE 0.
77 K PIC S9(6) VALUE 0.
77 VX PIC S9(6) VALUE 0.
77 VY PIC S9(6) VALUE 0.
77 MY PIC S9(6) VALUE 0.
77 RESULT PIC S9(6) VALUE 0.
77 T PIC 9 VALUE 0.
PROCEDURE DIVISION.
001-MAIN.
PERFORM VARYING I FROM -400 BY 1 UNTIL I > 400
PERFORM VARYING J FROM -400 BY 1 UNTIL J > 400
MOVE 0 TO T
MOVE 0 TO K
MOVE I TO VX
MOVE J TO VY
MOVE 0 TO X
MOVE 0 TO Y
MOVE 0 TO MY
PERFORM 002-STEP UNTIL T = 1 OR K = 1000
IF T = 1 THEN
ADD 1 TO RESULT
END-IF
END-PERFORM
END-PERFORM
DISPLAY RESULT.
STOP RUN.
* On each step, these changes occur in the following order:
* the probe's x position increases by vx
* the probe's y position increases by vy
* the probe's x velocity changes by 1 toward the value 0
* the probe's y velocity decreases by 1
002-STEP.
ADD 1 TO K.
ADD VX TO X.
ADD VY TO Y.
IF VX > 0 THEN
SUBTRACT 1 FROM VX
ELSE IF VX < 0 THEN
ADD 1 TO VX
END-IF
END-IF.
SUBTRACT 1 FROM VY.
IF Y > MY THEN
MOVE Y TO MY
END-IF
IF X >= X1 AND X <= X2 AND Y >= Y1 AND Y <= Y2 THEN
MOVE 1 TO T
END-IF.
| 30.348485 | 65 | 0.468797 |
1a4a6397f29a30281bfa572011dea6946b91a4bb | 3,240 | cbl | COBOL | cobol/testdata/local/testantlr250.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr250.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr250.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | ID Division. 00000001
Program-ID. testantlr250. 00000002
Procedure Division. 00000003
00000004
>>DEFINE A 1 00000005
>>DEFINE B 2 00000006
>>DEFINE C 3 00000007
>>DEFINE D A + B * C 00000008
>>DEFINE E (A + B) * C 00000009
>>DEFINE F A + (B * C) 00000010
00000011
>>EVALUATE D 00000012
>>WHEN 9 00000013
CALL 'D#IS#9' 00000014
>>WHEN 7 00000015
CALL 'D#IS#7' 00000016
>>WHEN OTHER 00000017
CALL 'WHATTHE#' 00000018
>>END-EVALUATE 00000019
00000020
>>EVALUATE E 00000021
>>WHEN 9 00000022
CALL 'E#IS#9' 00000023
>>WHEN 7 00000024
CALL 'E#IS#7' 00000025
>>WHEN OTHER 00000026
CALL 'WHATTHE#' 00000027
>>END-EVALUATE 00000028
00000029
>>EVALUATE F 00000030
>>WHEN 9 00000031
CALL 'F#IS#9' 00000032
>>WHEN 7 00000033
CALL 'F#IS#7' 00000034
>>WHEN OTHER 00000035
CALL 'WHATTHE#' 00000036
>>END-EVALUATE 00000037
00000038
00000039
GOBACK. 00000040
| 79.02439 | 80 | 0.19321 |
ac1a91d0850a994dc3b02dd1812367a0d4b7e27b | 3,002 | cbl | COBOL | cobol/testdata/local/testantlr031.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr031.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr031.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | Identification Division.
Program-ID. testantlr031.
Environment Division.
Configuration Section.
Special-Names.
XML-SCHEMA OSR-DATA-FILE IS OSRDATA1.
Data Division.
Working-Storage Section.
01 CONSTANTS.
05 MYNAME PIC X(012) VALUE 'testantlr031'.
*
01 SOME-DATA.
05 SD-001 PIC X(008).
05 SD-002.
10 SD-002-A PIC X(001).
10 SD-002-B PIC X(001).
05 SD-003 PIC X(008).
01 WS-BUF PIC X(100).
01 OSR-DATA PIC X(1024).
77 WS-COUNT PIC 9(008) COMP-5 VALUE 0.
Procedure Division.
DISPLAY MYNAME ' Begin'
XML PARSE WS-BUF PROCESSING PROCEDURE 1000-para END-XML
XML PARSE
WS-BUF
ENCODING 37
VALIDATING OSR-DATA
PROCESSING PROCEDURE 1000-para
EXCEPTION CALL 'CEE3ABD' END-CALL
NOT EXCEPTION PERFORM 2000-para
END-XML
XML PARSE
WS-BUF
WITH ENCODING 37
RETURNING NATIONAL
VALIDATING WITH OSR-DATA
PROCESSING PROCEDURE IS 1000-para
ON EXCEPTION CALL 'CEE3ABD'
NOT ON EXCEPTION PERFORM 2000-para
END-XML
XML PARSE
WS-BUF
WITH ENCODING 37
RETURNING NATIONAL
VALIDATING WITH FILE OSR-DATA-FILE
PROCESSING PROCEDURE IS 1000-para
ON EXCEPTION CALL 'CEE3ABD'
NOT ON EXCEPTION PERFORM 2000-para
END-XML
XML PARSE WS-BUF PROCESSING PROCEDURE 1000-para THRU
1001-end END-XML
XML PARSE
WS-BUF
ENCODING 37
VALIDATING OSR-DATA
PROCESSING PROCEDURE 1000-para THRU 1001-end
EXCEPTION CALL 'CEE3ABD'
NOT EXCEPTION PERFORM 2000-para
END-XML
XML PARSE
WS-BUF
WITH ENCODING 37
RETURNING NATIONAL
VALIDATING WITH OSR-DATA
PROCESSING PROCEDURE IS 1000-para THRU 1001-end
ON EXCEPTION CALL 'CEE3ABD' END-CALL
NOT ON EXCEPTION PERFORM 2000-para
END-XML
XML PARSE
WS-BUF
WITH ENCODING 37
RETURNING NATIONAL
VALIDATING WITH FILE OSR-DATA-FILE
PROCESSING PROCEDURE IS 1000-para THRU 1001-end
ON EXCEPTION CALL 'CEE3ABD'
NOT ON EXCEPTION PERFORM 2000-para
END-XML
DISPLAY MYNAME ' End'
GOBACK
.
1000-para.
.
1001-end.
.
2000-para.
.
| 27.541284 | 68 | 0.474017 |
d0d20000386695f37d25df9c5f296aa222714359 | 3,577 | cob | COBOL | contributions/cobol/programs/SampleCompany.cob | A-Kastner/101repo | 692a1a967b1d0f6db0c64739f9c13d68a6a6ae17 | [
"MIT"
] | 15 | 2015-04-23T02:43:22.000Z | 2021-12-07T13:39:26.000Z | contributions/cobol/programs/SampleCompany.cob | A-Kastner/101repo | 692a1a967b1d0f6db0c64739f9c13d68a6a6ae17 | [
"MIT"
] | 4 | 2021-12-02T15:53:30.000Z | 2022-02-09T22:54:15.000Z | contributions/cobol/programs/SampleCompany.cob | A-Kastner/101repo | 692a1a967b1d0f6db0c64739f9c13d68a6a6ae17 | [
"MIT"
] | 14 | 2015-06-04T10:05:20.000Z | 2021-03-08T12:20:26.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. SampleCompany
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
COPY "copybooks/department.fc".
COPY "copybooks/employee.fc".
DATA DIVISION.
FILE SECTION.
COPY "copybooks/department.fd".
COPY "copybooks/employee.fd".
WORKING-STORAGE SECTION.
COPY "copybooks/file-status.ws".
78 MEGANALYSIS VALUE "meganalysis".
78 RESEARCH VALUE "Research".
78 DEVELOPMENT VALUE "Development".
78 DEV1 VALUE "Dev1".
78 DEV11 VALUE "Dev1.1".
PROCEDURE DIVISION.
*
OPEN OUTPUT DEPT-FILE.
*
INITIALIZE DEPT-RECORD.
MOVE MEGANALYSIS TO DEPT-COMPANY.
MOVE RESEARCH TO DEPT-NAME.
MOVE "Craig" TO DEPT-MANAGER.
WRITE DEPT-RECORD.
*
INITIALIZE DEPT-RECORD.
MOVE MEGANALYSIS TO DEPT-COMPANY.
MOVE DEVELOPMENT TO DEPT-NAME.
MOVE "Ray" TO DEPT-MANAGER.
WRITE DEPT-RECORD.
*
INITIALIZE DEPT-RECORD.
MOVE MEGANALYSIS TO DEPT-COMPANY.
MOVE DEV1 TO DEPT-NAME.
MOVE "Klaus" TO DEPT-MANAGER.
MOVE DEVELOPMENT TO DEPT-ANCESTOR.
WRITE DEPT-RECORD.
*
INITIALIZE DEPT-RECORD.
MOVE MEGANALYSIS TO DEPT-COMPANY.
MOVE DEV11 TO DEPT-NAME.
MOVE "Karl" TO DEPT-MANAGER.
MOVE DEV1 TO DEPT-ANCESTOR.
WRITE DEPT-RECORD.
*
CLOSE DEPT-FILE.
*
OPEN OUTPUT EMPL-FILE.
*
INITIALIZE EMPL-RECORD.
MOVE MEGANALYSIS TO EMPL-COMPANY.
MOVE RESEARCH TO EMPL-DEPT.
MOVE "Craig" TO EMPL-NAME.
MOVE "Redmond" TO EMPL-ADDR.
MOVE 123456 TO EMPL-SALARY.
WRITE EMPL-RECORD.
*
INITIALIZE EMPL-RECORD.
MOVE MEGANALYSIS TO EMPL-COMPANY.
MOVE RESEARCH TO EMPL-DEPT.
MOVE "Erik" TO EMPL-NAME.
MOVE "Utrecht" TO EMPL-ADDR.
MOVE 12345 TO EMPL-SALARY.
WRITE EMPL-RECORD.
*
INITIALIZE EMPL-RECORD.
MOVE MEGANALYSIS TO EMPL-COMPANY.
MOVE RESEARCH TO EMPL-DEPT.
MOVE "Ralf" TO EMPL-NAME.
MOVE "Koblenz" TO EMPL-ADDR.
MOVE 1234 TO EMPL-SALARY.
WRITE EMPL-RECORD.
*
INITIALIZE EMPL-RECORD.
MOVE MEGANALYSIS TO EMPL-COMPANY.
MOVE DEVELOPMENT TO EMPL-DEPT.
MOVE "Ray" TO EMPL-NAME.
MOVE "Redmond" TO EMPL-ADDR.
MOVE 234567 TO EMPL-SALARY.
WRITE EMPL-RECORD.
*
INITIALIZE EMPL-RECORD.
MOVE MEGANALYSIS TO EMPL-COMPANY.
MOVE DEV1 TO EMPL-DEPT.
MOVE "Klaus" TO EMPL-NAME.
MOVE "Boston" TO EMPL-ADDR.
MOVE 23456 TO EMPL-SALARY.
WRITE EMPL-RECORD.
*
INITIALIZE EMPL-RECORD.
MOVE MEGANALYSIS TO EMPL-COMPANY.
MOVE DEV11 TO EMPL-DEPT.
MOVE "Karl" TO EMPL-NAME.
MOVE "Riga" TO EMPL-ADDR.
MOVE 2345 TO EMPL-SALARY.
WRITE EMPL-RECORD.
*
INITIALIZE EMPL-RECORD.
MOVE MEGANALYSIS TO EMPL-COMPANY.
MOVE DEV11 TO EMPL-DEPT.
MOVE "Joe" TO EMPL-NAME.
MOVE "Wifi City" TO EMPL-ADDR.
MOVE 2344 TO EMPL-SALARY.
WRITE EMPL-RECORD.
*
CLOSE EMPL-FILE.
*
STOP RUN.
| 30.57265 | 44 | 0.540117 |
900cdd878ce26f2e064d846e7cb5215f662c24c5 | 162 | cbl | COBOL | src/test/resources/io/proleap/cobol/asg/data/localstorage/DataDescription01.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 81 | 2018-03-29T23:39:01.000Z | 2022-03-07T11:23:10.000Z | src/test/resources/io/proleap/cobol/asg/data/localstorage/DataDescription01.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 64 | 2017-03-27T11:15:15.000Z | 2018-03-09T18:10:43.000Z | src/test/resources/io/proleap/cobol/asg/data/localstorage/DataDescription01.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 44 | 2019-01-03T11:48:54.000Z | 2021-12-21T09:46:42.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. DATADESCR01.
DATA DIVISION.
LOCAL-STORAGE SECTION.
LD SOMELD.
01 ITEMS.
02 ITEM1 PIC X(10).
02 ITEM2 PIC X(10). | 20.25 | 25 | 0.703704 |
a4ac2babf9d42e245fca5ee2fa5c2af9f7fe4690 | 188 | cbl | COBOL | src/test/resources/io/proleap/cobol/asg/procedure/receive/ReceiveIntoStatement.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 81 | 2018-03-29T23:39:01.000Z | 2022-03-07T11:23:10.000Z | src/test/resources/io/proleap/cobol/asg/procedure/receive/ReceiveIntoStatement.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 64 | 2017-03-27T11:15:15.000Z | 2018-03-09T18:10:43.000Z | src/test/resources/io/proleap/cobol/asg/procedure/receive/ReceiveIntoStatement.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 44 | 2019-01-03T11:48:54.000Z | 2021-12-21T09:46:42.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. RECEIVEINTOSTMT.
PROCEDURE DIVISION.
RECEIVE SOMECD1 MESSAGE INTO SOMEID1
NO DATA DISPLAY 'no data'
WITH DATA DISPLAY 'WITH DATA'. | 31.333333 | 40 | 0.728723 |
81ab654246ced02737ff7aa8b31cdf3477f1abd8 | 2,096 | cpy | COBOL | CopyBooks/FAKPHONW.cpy | dinodev76/COB-FAKER | 984e44a309d8d52a7a376a647f049d0a40cd75fb | [
"MIT"
] | 1 | 2020-08-17T20:18:48.000Z | 2020-08-17T20:18:48.000Z | CopyBooks/FAKPHONW.cpy | dinodev76/COB-FAKER | 984e44a309d8d52a7a376a647f049d0a40cd75fb | [
"MIT"
] | null | null | null | CopyBooks/FAKPHONW.cpy | dinodev76/COB-FAKER | 984e44a309d8d52a7a376a647f049d0a40cd75fb | [
"MIT"
] | null | null | null | *========================== COB-FAKER ===========================*
* Authors: Brian D Pead
*
* License: MIT
*
* Date Version Description
* ---- ------- -----------
* 2020-02-11 1.0.1 Add TELETELEPHONE numbers
*================================================================*
01 TELEPHONE-NUMBER-FORMATS.
05 TELEPHONE-NUMBER-FORMAT-CNT
PIC S9(4) COMP VALUE 8.
05 TELEPHONE-NUMBER-FORMAT-OCCS.
**** Standard 10-digit TELEPHONE number formats:
10 FILLER PIC X(20) VALUE
'%##-%##-####'.
10 FILLER PIC X(20) VALUE
'%##-%##-####'.
**** Optional 10-digit local TELEPHONE number format
10 FILLER PIC X(20) VALUE
'(%##)%##-####'.
10 FILLER PIC X(20) VALUE
'(%##)%##-####'.
**** Standard 10-digit TELEPHONE number format with extensions:
10 FILLER PIC X(20) VALUE
'%##-%##-#### X%##'.
10 FILLER PIC X(20) VALUE
'%##-%##-#### X%###'.
**** Optional 10-digit local TELEPHONE number format with ext:
10 FILLER PIC X(20) VALUE
'(%##)%##-#### X%##'.
10 FILLER PIC X(20) VALUE
'(%##)%##-#### X%###'.
05 FILLER REDEFINES TELEPHONE-NUMBER-FORMAT-OCCS.
10 FILLER OCCURS 8
INDEXED PN-DX.
15 TELEPHONE-NUMBER-FORMAT
PIC X(20).
| 52.4 | 73 | 0.292462 |
faee91e5c0c3619c7fc1fb823c6e05a57e18f73b | 650 | cob | COBOL | CGJOB002.cob | miguelmorais7/Cobol-EXs | 4edccadf22a09f951bfa2653d063beea17545845 | [
"MIT"
] | null | null | null | CGJOB002.cob | miguelmorais7/Cobol-EXs | 4edccadf22a09f951bfa2653d063beea17545845 | [
"MIT"
] | null | null | null | CGJOB002.cob | miguelmorais7/Cobol-EXs | 4edccadf22a09f951bfa2653d063beea17545845 | [
"MIT"
] | null | null | null | //GPAZ99J2 JOB SATOSHI,MSGCLASS=X,CLASS=C,NOTIFY=GPAZ99,TIME=(0,20)
//*****************************************************************
//* LER DADOS DA SYSIN - REGISTRO COM '99...99' INDICA FIM DOS REG.
//*****************************************************************
//STEP1 EXEC PGM=CGPRG005
//STEPLIB DD DSN=GP.GERAL.LOADLIB,DISP=SHR
//SYSIN DD *
0014ELIS REGINA F95MUSICA 08500950
0024ROGERIO CENI M45FUTEBOL 03500540
0034MARIA E. BUENO F80TENIS CAMPO 08000850
0044REI PELE M75ED.FISICA 09800870
0055AIRTON SENNA M55CORRIDAS F1010000950
99999999999999999999999999999999999999999999999
//*
| 43.333333 | 67 | 0.570769 |
0fb96774dba97bd0a1e5cb6a4e023d718142577f | 1,360 | cob | COBOL | cob/PROGCOB13.cob | lucasrmagalhaes/COBOL-cbl | abf4b0dac0012cd6d441127b07b65b20a1d58c01 | [
"MIT"
] | 2 | 2020-12-09T17:07:36.000Z | 2020-12-15T13:58:12.000Z | cob/PROGCOB13.cob | lucasrmagalhaes/COBOL-cbl | abf4b0dac0012cd6d441127b07b65b20a1d58c01 | [
"MIT"
] | null | null | null | cob/PROGCOB13.cob | lucasrmagalhaes/COBOL-cbl | abf4b0dac0012cd6d441127b07b65b20a1d58c01 | [
"MIT"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. PROGCOB13.
**********************************************************
* AREA DE COMENTARIOS - REMARKS
* AUTHOR: LUCAS LRM
* DATA: 29/11/2020
* OBJETIVO: RECEBER UM NUMERO E GERAR A TABUADA DE 1 A 10
* UTILIZAR O PERFORM
**********************************************************
ENVIRONMENT DIVISION.
DATA DIVISION.
WORKING-STORAGE SECTION.
77 WRK-NUMERO PIC 9(02) VALUE ZEROS.
77 WRK-CONTADOR PIC 9(02) VALUE 1.
77 WRK-RESUL PIC 9(02) VALUE ZEROS.
PROCEDURE DIVISION.
0001-PRINCIPAL.
PERFORM 0100-INICIALIZAR.
IF WRK-NUMERO > 0
PERFORM 0200-PROCESSAR
END-IF.
PERFORM 0300-FINALIZAR.
STOP RUN.
0100-INICIALIZAR.
DISPLAY 'DIGITE UM NUMERO PARA REALIZAR A TABUADA: '.
ACCEPT WRK-NUMERO.
0200-PROCESSAR.
PERFORM 10 TIMES
COMPUTE WRK-RESUL = WRK-NUMERO * WRK-CONTADOR
DISPLAY WRK-NUMERO ' x ' WRK-CONTADOR ' = ' WRK-RESUL
ADD 1 TO WRK-CONTADOR
END-PERFORM.
0300-FINALIZAR.
DISPLAY '=========================================='
DISPLAY 'FINAL DE PROCESSAMENTO'.
| 32.380952 | 69 | 0.469118 |
668198fa461bed818ca3552e30103e586ffac21c | 1,062 | cbl | COBOL | src/SimpleCalculator.cbl | romankh3/cobol-code-example | fe6788353de1d45c55f052cef823d367ad40e5ba | [
"Apache-2.0"
] | 4 | 2020-03-17T19:21:33.000Z | 2021-06-22T06:29:20.000Z | src/SimpleCalculator.cbl | romankh3/cobol-code-example | fe6788353de1d45c55f052cef823d367ad40e5ba | [
"Apache-2.0"
] | null | null | null | src/SimpleCalculator.cbl | romankh3/cobol-code-example | fe6788353de1d45c55f052cef823d367ad40e5ba | [
"Apache-2.0"
] | 1 | 2022-02-09T15:08:02.000Z | 2022-02-09T15:08:02.000Z | 000100 IDENTIFICATION DIVISION.
000200 PROGRAM-ID. SIMPLE CALCULATOR.
000300* --- Это пустая строчка. ---
000400 ENVIRONMENT DIVISION.
000500 DATA DIVISION.
000510 WORKING-STORAGE SECTION.
000520 01 WS-A PIC 999.
000530 01 WS-B PIC 9(3).
000540 01 WS-RESULT PIC 9(6).
000600 PROCEDURE DIVISION.
000700 BEGIN.
000800 DISPLAY “Hello I'm your new calculator!”.
000900 DISPLAY “Please Enter first number from 0 to 999”.
001000 ACCEPT WS-A.
001100 DISPLAY “Please Enter second number from 0 to 999”.
001200 ACCEPT WS-B.
001300 DISPLAY “------------------------------------”.
001400 DISPLAY “ “.
001500 DISPLAY “Your results are:”.
001600 ADD WS-A TO WS-B GIVING WS-RESULT.
001700 DISPLAY “Summ is: ”, WS-RESULT.
001800 SUBTRACT WS-A FROM WS-B GIVING WS-RESULT.
001900 DISPLAY “Subtract is: ”, WS-RESULT.
002000 MULTIPLY WS-A BY WS-B GIVING WS-RESULT.
002100 DISPLAY “Multiplication is: ”, WS-RESULT.
002200 DIVIDE WS-A BY WS-B GIVING WS-RESULT.
002300 DISPLAY “Divide is: ”, WS-RESULT.
002400 STOP RUN. | 37.928571 | 61 | 0.683616 |
bca9280178e2bd1dd9cd4bf8b76772549b6d40a1 | 609 | cobol | COBOL | Task/Count-occurrences-of-a-substring/COBOL/count-occurrences-of-a-substring.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Count-occurrences-of-a-substring/COBOL/count-occurrences-of-a-substring.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Count-occurrences-of-a-substring/COBOL/count-occurrences-of-a-substring.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. testing.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 occurrences PIC 99.
PROCEDURE DIVISION.
INSPECT "the three truths" TALLYING occurrences FOR ALL "th"
DISPLAY occurrences
MOVE 0 TO occurrences
INSPECT "ababababab" TALLYING occurrences FOR ALL "abab"
DISPLAY occurrences
MOVE 0 TO occurrences
INSPECT "abaabba*bbaba*bbab" TALLYING occurrences
FOR ALL "a*b"
DISPLAY occurrences
GOBACK
.
| 26.478261 | 71 | 0.568144 |
c4442db54780efa40d0508fbba25af77951e945a | 1,933 | cob | COBOL | AdventOfCode2021/d03a.cob | GaloisGirl/Coding | 24870ff58c3e5c155547276f7a6fd3e613f60b5e | [
"MIT"
] | 13 | 2020-12-11T23:07:24.000Z | 2021-12-27T23:58:22.000Z | AdventOfCode2021/d03a.cob | GaloisGirl/Coding | 24870ff58c3e5c155547276f7a6fd3e613f60b5e | [
"MIT"
] | 1 | 2020-12-20T22:16:33.000Z | 2021-08-17T16:54:08.000Z | AdventOfCode2021/d03a.cob | GaloisGirl/Coding | 24870ff58c3e5c155547276f7a6fd3e613f60b5e | [
"MIT"
] | 2 | 2020-12-20T22:02:08.000Z | 2021-12-23T14:42:07.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. AOC-2021-03-1.
AUTHOR. ANNA KOSIERADZKA.
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT INPUTFILE ASSIGN TO "d03.input"
ORGANIZATION IS LINE SEQUENTIAL.
DATA DIVISION.
FILE SECTION.
FD INPUTFILE.
01 INPUTRECORD PIC X(12).
WORKING-STORAGE SECTION.
01 FILE-STATUS PIC 9 VALUE 0.
01 N PIC 9(2) VALUE 12.
01 M PIC 9(4) VALUE 1000.
01 WS-GAMMA-DEC PIC 9(8) VALUE 0.
01 WS-EPSILON-DEC PIC 9(8) VALUE 0.
01 WS-COUNTS-1 PIC 9(3) VALUE 0
OCCURS 0 TO 12 TIMES DEPENDING ON N.
01 WS-RESULT PIC 9(16).
LOCAL-STORAGE SECTION.
01 I UNSIGNED-INT VALUE 1.
PROCEDURE DIVISION.
001-MAIN.
OPEN INPUT INPUTFILE.
PERFORM 002-READ UNTIL FILE-STATUS = 1.
CLOSE INPUTFILE.
PERFORM 004-COMPUTE-GAMMA-DEC.
COMPUTE WS-RESULT = WS-GAMMA-DEC * WS-EPSILON-DEC.
DISPLAY WS-RESULT.
STOP RUN.
002-READ.
READ INPUTFILE
AT END MOVE 1 TO FILE-STATUS
NOT AT END PERFORM 003-PROCESS-RECORD
END-READ.
003-PROCESS-RECORD.
PERFORM VARYING I FROM 1 BY 1 UNTIL I > N
IF INPUTRECORD(I:1) = '1' THEN
ADD 1 TO WS-COUNTS-1(I)
END-IF
END-PERFORM.
004-COMPUTE-GAMMA-DEC.
PERFORM VARYING I FROM 1 BY 1 UNTIL I > N
COMPUTE WS-GAMMA-DEC = WS-GAMMA-DEC * 2
COMPUTE WS-EPSILON-DEC = WS-EPSILON-DEC * 2
IF WS-COUNTS-1(I) > M / 2 THEN
COMPUTE WS-GAMMA-DEC = WS-GAMMA-DEC + 1
ELSE
COMPUTE WS-EPSILON-DEC = WS-EPSILON-DEC + 1
END-IF
END-PERFORM.
| 30.68254 | 62 | 0.518365 |
a9f1b92c6610e01c29f62eb38363c0c8a8c09cc1 | 2,217 | cbl | COBOL | chapter-02/SalutationStore/src/com/mfcobolbook/examples/SalutationStore.cbl | MicroFocus/visual-cobol-for--java-developers-book | d46a5f173e4f8df67456dab3b9ce52fe0c7fceaa | [
"MIT"
] | 2 | 2022-01-04T20:05:39.000Z | 2022-01-21T10:03:14.000Z | chapter-02/SalutationStore/src/com/mfcobolbook/examples/SalutationStore.cbl | MicroFocus/visual-cobol-for--java-developers-book | d46a5f173e4f8df67456dab3b9ce52fe0c7fceaa | [
"MIT"
] | null | null | null | chapter-02/SalutationStore/src/com/mfcobolbook/examples/SalutationStore.cbl | MicroFocus/visual-cobol-for--java-developers-book | d46a5f173e4f8df67456dab3b9ce52fe0c7fceaa | [
"MIT"
] | 2 | 2021-10-06T00:55:11.000Z | 2022-01-31T16:44:59.000Z | *****************************************************************
* *
* Copyright (C) 2020-2022 Micro Focus. All Rights Reserved. *
* This software may be used, modified, and distributed *
* (provided this notice is included without modification) *
* solely for demonstration purposes with other *
* Micro Focus software, and is otherwise subject to the EULA at *
* https://www.microfocus.com/en-us/legal/software-licensing. *
* *
* THIS SOFTWARE IS PROVIDED "AS IS" AND ALL IMPLIED *
* WARRANTIES, INCLUDING THE IMPLIED WARRANTIES OF *
* MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE, *
* SHALL NOT APPLY. *
* TO THE EXTENT PERMITTED BY LAW, IN NO EVENT WILL *
* MICRO FOCUS HAVE ANY LIABILITY WHATSOEVER IN CONNECTION *
* WITH THIS SOFTWARE. *
* *
*****************************************************************
class-id com.mfcobolbook.examples.SalutationStore public.
01 greetingsDictionary dictionary[string, string].
method-id new.
invoke initData()
end method.
method-id initData.
create greetingsDictionary
write greetingsDictionary from "Hello World" key "english"
write greetingsDictionary from "Bonjour le monde" key "french"
write greetingsDictionary from "Hallo Welt" key "german"
end method.
method-id fetchGreeting(language as string) returning result as string.
set language to language::toLowerCase()
read greetingsDictionary into result key language
invalid key
set result to "I don't speak this language"
end-read
end method.
end class.
| 48.195652 | 78 | 0.467749 |
ae8f30ea747a11522d14227f757fd792b198ebb6 | 2,666 | cbl | COBOL | cobol/testdata/local/testantlr154.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr154.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr154.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | 000001 ID Division.
000002 Program-ID. testantlr154.
000003 Procedure Division.
000004
000005 >>DEFINE VAR1 1
000006 >>DEFINE VAR2 2
000007 >>DEFINE VAR3 3
000008 >>DEFINE VAR4 4
000009
000010 >>EVALUATE VAR1
000011 >>WHEN VAR2
000012 EXEC CICS
000013 LINK
000014 PROGRAM('PGM00001')
000015 END-EXEC
000016 >>WHEN VAR3
000017 EXEC CICS
000018 LINK
000019 PROGRAM('PGM00002')
000020 END-EXEC
000021 >>WHEN VAR4
000022 EXEC CICS
000023 LINK
000024 PROGRAM('PGM00003')
000025 END-EXEC
000026 >>WHEN OTHER
000027 EXEC CICS
000028 LINK
000029 PROGRAM('PGM00004')
000030 END-EXEC
000031 >>END-EVALUATE
000032
000033 >>EVALUATE VAR1
000034 >>WHEN VAR2 - 1
000035 EXEC CICS
000036 LINK
000037 PROGRAM('PGM00005')
000038 END-EXEC
000039 >>WHEN VAR3 - 1
000040 EXEC CICS
000041 LINK
000042 PROGRAM('PGM00006')
000043 END-EXEC
000044 >>WHEN VAR4 - 1
000045 EXEC CICS
000046 LINK
000047 PROGRAM('PGM00007')
000048 END-EXEC
000049 >>WHEN OTHER
000050 EXEC CICS
000051 LINK
000052 PROGRAM('PGM00008')
000053 END-EXEC
000054 >>END-EVALUATE
000055
000056 >>IF VAR1 = VAR2 - 1
000057 EXEC CICS
000058 LINK
000059 PROGRAM('PGM00009')
000060 END-EXEC
000061 >>END-IF
000062
000063 >>EVALUATE VAR1 + 1
000064 >>WHEN VAR2 - 1
000065 EXEC CICS
000066 LINK
000067 PROGRAM('PGM00010')
000068 END-EXEC
000069 >>WHEN VAR3 - 1
000070 EXEC CICS
000071 LINK
000072 PROGRAM('PGM00011')
000073 END-EXEC
000074 >>WHEN VAR4 - 1
000075 EXEC CICS
000076 LINK
000077 PROGRAM('PGM00012')
000078 END-EXEC
000079 >>WHEN OTHER
000080 EXEC CICS
000081 LINK
000082 PROGRAM('PGM00013')
000083 END-EXEC
000084 >>END-EVALUATE
000085
000086 >>EVALUATE TRUE
000087 >>WHEN VAR1 = VAR2
000088 EXEC CICS
000089 LINK
000090 PROGRAM('PGM00014')
000091 END-EXEC
000092 >>WHEN VAR3 = VAR4
000093 EXEC CICS
000094 LINK
000095 PROGRAM('PGM00015')
000096 END-EXEC
000097 >>WHEN VAR4 - 1 = VAR2 + 1
000098 EXEC CICS
000099 LINK
000100 PROGRAM('PGM00016')
000101 END-EXEC
000102 >>WHEN OTHER
000103 EXEC CICS
000104 LINK
000105 PROGRAM('PGM00017')
000106 END-EXEC
000107 >>END-EVALUATE
000108
000109 >>IF VAR4 - 1 = VAR2 + 1
000110 EXEC CICS
000111 LINK
000112 PROGRAM('PGM00018')
000113 END-EXEC
000114 >>END-IF
000115
000116 GOBACK.
| 22.786325 | 35 | 0.631658 |
be241d7c857311ed7af3e2888ddaaeebb960ace8 | 72,764 | cob | COBOL | Source/T3DIICHAP09/water_flat_01.cob | TwTravel/3dGameGuru | 50f204da32b7d3ddcbdb0daf140d503eac424153 | [
"Unlicense"
] | null | null | null | Source/T3DIICHAP09/water_flat_01.cob | TwTravel/3dGameGuru | 50f204da32b7d3ddcbdb0daf140d503eac424153 | [
"Unlicense"
] | 1 | 2019-12-10T15:47:15.000Z | 2019-12-10T15:47:15.000Z | Source/T3DIICHAP09/water_flat_01.cob | TwTravel/3dGameGuru | 50f204da32b7d3ddcbdb0daf140d503eac424153 | [
"Unlicense"
] | null | null | null | Caligari V00.01ALH
BitM V0.01 Id 0 Parent 0 Size 00010957
ThumbNailHdrSize 40
ThumbHeader:28 00 00 00 5e 00 00 00 5e 00 00 00 01 00 18 00 00 00 00 00 48 68 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
ColorBufSize 26696
ColorBufZipSize 3582
ZippedThumbnail:78 9c ed 9c 3d 88 e3 48 16 c7 15 28 a8 c0 81 83 09 14 74 b0 86 0e c6 b0 c1 18 26 31 4c 32 86 0b 5a 30 c1 1a 26 b8 86 0b 1a 31 91 99 c8 5c d0 98 4b 0e d1 91 a3 41 6c 70 88 0e 16 74 c1 80 26 58 d0 04 0d ba 50 a1 43 87 4e 1d 3a 74 38 fb 54 e5 2a bf fa 92 4a 6e 77 f7 2e 1c fc 31 6e 7d d5 ab df fb bf 57 b2 65 ba fc 5f 59 fe 5f 26 79 de 8b 87 20 54 7d 2f 56 5f 96 a0 ea 6b f6 e2 c1 bc 34 9b ea 5b 5e c3 b8 5d 6c 3f 84 bb 9f 82 3d f1 76 c4 fb 41 5f b7 17 c1 e6 43 b8 fe 14 c1 de 97 42 f5 bc 6c 04 0c 98 37 cc 7e 4b 49 b4 6a 4f 51 ad 9f 1d d5 b3 b0 a9 1e ca 35 87 b1 77 e3 d1 c0 e9 e0 aa 77 a3 ea d7 e4 2f ce 66 f5 6b b2 bd 0c 1e 89 c4 a8 4d cf 5b dd 44 00 fe 2f c8 06 a2 86 da 79 0a 2a c7 5a 23 de ea 32 78 22 03 3d 19 1b 88 77 f7 34 76 31 e0 e9 79 d5 4d 54 9e db 40 4f c0 06 ec b2 a2 76 79 6a 30 18 0f a8 ba 0c ca b3 1a e8 dc 6c c0 2e eb cb e0 19 90 28 da d2 1e 5d f6 bc f2 7c 06 3a 1f 1b 66 97 b5 ff dc 54 84 76 54 2b df 2b 7e 3a 8f 81 ce c4 06 ec 02 3d d1 f1 7e e5 19 f0 e4 3d af 78 b4 81 ce c1 a6 ba 8b 21 9c 17 07 b3 e7 77 3f 0c 4f 6d a0 8f d3 97 65 03 a5 14 f4 5f 1c 8c c0 b3 e3 5a 13 2f f7 bd f2 2e 7e 39 36 d5 87 10 32 b4 7b 69 2a 8a 6f 76 b4 3b 97 50 5c af fa e5 b7 fc 45 d8 d0 6a da f0 b8 fe 3c 6c 0e ab ba 5f 5b 27 bf 0a 9f 9f 0d ad 26 60 b3 ff 13 b0 d1 c1 6c a8 80 4d 06 8d e7 a4 ca 7a 04 9b 82 56 d3 86 86 f3 b2 78 f4 6a 62 60 d6 bc eb 64 27 55 d6 c9 6c ee e2 82 ae 05 5b 1e d1 de 44 e8 19 3e 33 e8 60 b6 08 0c 63 73 5a 65 9d c6 e6 a1 84 1e c7 c0 6c 51 5c 7b 93 9e b9 94 b0 69 d8 4a be f2 4f ac ac 93 d8 14 90 03 3a e6 86 a8 78 04 24 1d d5 33 94 92 52 4d 10 61 e5 f3 8e dc bd b2 ba b3 01 fa 19 05 b3 e6 81 6c 91 74 48 4f 44 a8 01 0c 36 0d 80 29 a9 98 75 3a 55 56 57 36 0f 65 4d 9f b1 f1 8f b1 6c 35 ed ec 9c 9e a8 c7 e8 d5 54 71 36 05 67 d3 a9 b2 3a b2 c9 3f 4e 0b 3a 20 63 83 f1 6c 50 80 ad 36 7a 24 95 66 30 ba 69 0a 51 56 ac b2 dc 3e 67 75 64 93 5d 04 05 6f 70 6b 54 56 ba 30 9e ad 9d d0 de 32 7b 17 2a 36 30 6b cd 34 12 1b d8 78 9f 9e 9d cd 43 99 d2 d1 56 c8 37 0d 78 5c 6a 6d 6f 9a ba 71 bd 6b a6 82 17 6d dd 34 b8 a6 60 0a c5 ed e2 dc 6c 8a 2f cb 9c 17 14 66 c3 d4 4c 48 e7 a4 db a8 79 b1 db 21 0b ba 80 51 0a 2a 43 6c 72 b7 cf e7 5d d8 e4 37 51 4e 47 d3 f1 6c 1c 08 19 39 e9 2d db b8 51 f1 4a 33 18 bd 0b e7 9c 0a 53 f6 76 74 6e 36 d9 bb 71 ce 87 5d 29 78 64 0f b9 40 d2 7b 92 de ca 8d d2 91 e0 06 53 59 c0 60 36 29 7c 44 77 68 c7 5d d8 a4 b4 11 2b 6c 54 42 44 85 84 67 20 76 d9 20 d9 ec a5 1c 6f ac 20 51 44 fa da 24 a8 24 fc 8d 4b 3b 76 67 f3 50 26 74 a8 d2 82 47 f5 90 2f 23 b1 ed 35 cd db b8 65 6d af 1d 05 8c de 7c 05 98 84 bf c9 1d da b1 33 1b 68 c4 99 cc c6 46 88 41 d2 51 89 ed 46 b7 e1 5b 13 9b ed 8c 48 f0 42 8d 97 6b dd 31 58 99 43 3b 76 66 93 7f 9e 65 7c 70 17 3c 27 08 1b 62 65 c1 d9 60 14 85 4a a6 51 59 72 d5 ee 71 68 c7 ce 6c b2 ab 30 45 6c 4a 99 d0 c9 3c f4 73 c5 05 2b 0d 86 ad a9 d8 a8 18 c1 30 36 89 43 3b 76 66 03 8d 38 43 19 2a 35 f7 18 67 69 9c 5c d5 b8 4b b9 72 69 52 21 77 5b f3 62 24 53 89 b9 04 a1 a2 ad 1d 3b b2 79 28 97 ec 73 ac dd 3a 8f 94 b8 9a 02 40 2f 1c a1 4c 96 d1 2b 89 0c 06 e3 69 6d c7 6e 6c a0 11 0b 36 a7 e1 31 a6 df e6 09 9b 72 93 51 5a 2b 28 b6 a8 b5 1d bb b1 c9 ef e2 25 bb a3 b4 e0 69 20 f4 18 2a b9 49 82 47 43 05 e9 6c 16 b2 60 4b fa b7 c9 59 7c f3 35 63 fe 14 a9 ca d1 0c 1e 69 88 5c 26 61 ec 22 c6 da 71 31 ca c2 a2 da 37 9f 67 67 ea c5 71 9f 24 3c 5b 99 c9 40 0d b5 d0 6a 85 06 7f e8 3c 94 9b 15 5b e1 08 0c 73 93 60 7b fe 65 79 26 36 cb 37 a3 25 ba ed d6 f1 b8 23 c1 e7 ba 5b c4 88 44 80 d1 9d 21 18 d8 d8 94 df 8b 33 b1 49 6f a2 58 dc 38 99 f0 74 b5 82 91 84 de 48 12 4d cd 8d 44 c7 30 43 9a f3 d7 c5 45 d0 3a 65 f7 7b bf bb 78 c1 17 c0 44 76 8f d1 04 8e 3c 8c fe 68 e8 25 46 2a 46 67 cc 1a b5 74 f8 52 dd fd f3 d4 d7 8c 59 71 29 e3 49 65 48 cd 9e b0 61 d0 fd 61 bb 73 8b 79 27 55 c0 cc 64 1e 11 7f c5 12 db 41 69 5b 23 ee c2 06 34 eb 91 b9 7c fb 94 68 25 96 6a 45 d1 2c 7c 93 66 7c 6f ac 1d a3 39 74 1e d7 20 cf 4c a8 b5 11 77 64 b3 78 33 9a a1 35 d0 68 20 17 4f d8 fa 87 51 18 8c ad 64 22 4d 80 04 0b 6f 67 6f 5a 1b 71 47 36 cb 9b 28 e2 4d 7e 61 32 50 c3 ec f5 3f 5b 6f 5d 75 30 0d 30 22 19 c6 14 49 e7 34 0b da 1b 71 47 36 e9 5d 0c d7 9e a1 65 b0 99 90 8b 21 62 74 11 db 9f 0b d9 2b 0d 48 14 30 21 95 20 24 38 c5 6e 4f 37 3b 3d 67 f8 9a c1 e5 23 ef b8 1e ce e5 fa 6a 60 20 de b7 de b7 ce 4d 5b e6 32 15 9d 87 e2 15 01 26 94 09 31 3c 89 43 23 ee c8 06 34 ed 91 43 c9 72 03 e9 ee b1 7d b6 73 bc 1d b1 2d c8 ee 48 8c 6c 30 9e cc a1 11 77 67 33 7b 37 66 83 60 f7 60 36 2e 9f 65 44 75 cc 91 ff 8c f7 69 92 63 1a a9 e8 24 8c 62 07 97 bf b7 37 e2 ee 6c f2 fb 34 24 f5 20 d7 de d1 3a d8 3d c6 02 99 cb a5 d1 2a 65 c9 9d c9 60 6c 48 26 54 ad 78 16 ce 3f ac ed fe 1b 13 b8 f6 84 5b 27 f2 d5 ca 72 bc 77 37 af 35 68 99 65 ec 23 3e 4a ab 51 26 48 36 2a b0 eb fa 72 e0 fe 83 ec ae be f9 5a cd ff b9 1e f6 e6 63 2f 08 b5 ca 6a b8 05 31 20 c1 eb aa a9 91 38 96 0f e3 31 6e c4 23 b6 e7 6e bf 12 e8 c2 26 fe f7 2a fc 65 13 5c fe 20 bd a3 06 24 9f fa 63 65 d9 52 16 5b 9d 47 64 21 31 75 90 cd 28 e3 46 36 6c cb c8 9f 84 6f 13 c8 ed f9 d8 64 bf 55 c3 b7 1b 8c a4 56 9f ab f7 63 ea 0f 04 03 f3 ed 99 85 47 eb ec 43 f9 1e c5 08 66 8c 64 63 33 f2 a3 a0 b7 16 c1 7b bd 5d f4 69 5d 3e b4 43 6a 64 b3 f8 d7 aa 1f fc b0 82 a1 ea cb 78 70 eb 74 a1 62 ec 0a 0d 0d 43 b7 4b 33 9e 21 49 44 1a 25 d3 bf de 24 ff 69 c1 63 61 53 7c af 26 57 60 97 7d 33 18 81 27 f4 27 e2 63 9c 98 bd e3 8d d9 c4 4d 36 bb 18 c1 50 91 01 49 d5 68 a5 b9 6c a2 4f ab 06 03 99 d8 d4 76 79 a5 d5 91 9d 0d d3 88 24 91 5f df 19 4e e4 1b 2d 97 c5 a5 6d 96 e6 c3 46 f6 13 a1 bb f4 6d d1 a2 e9 78 bd fd e0 72 6d 33 90 c6 26 be ab bc ba 3a 35 c7 38 e0 09 7a bb a1 7f 3d 41 78 6c a5 11 36 3a a0 55 23 2e c3 2e 7f 12 90 aa 21 48 d3 8c a8 81 5a d8 e4 df aa e0 62 05 dd ea 34 36 07 42 a4 18 7b 7d e3 62 61 33 01 9e eb 48 9b ba ed cf 91 7c 85 61 ed 95 75 6b 78 ca 74 c0 3a 30 5f 8f 54 e9 bd ea 1e 99 cd e4 3d 98 66 e3 f5 b6 94 4d 47 3c e8 80 7e 6f 37 f2 c7 13 b7 06 3a 3a 83 fa 01 c9 db 53 67 9a 8b 47 57 2e 98 f2 f0 e7 52 b9 2d 44 6c e2 bb d2 23 2b ca 06 7c b3 b3 82 c1 84 7a 4d c3 06 24 1b 7b c4 91 c4 10 49 ff b3 41 03 3f 6a 4f 9d 7d 16 82 8d 47 d6 d3 bf 1b d9 e4 df ca 7e 50 42 a7 61 be a1 87 ef b8 7b ec 06 6a 53 9f 54 23 8f b8 f0 60 1a 50 e9 db 87 66 5a 60 97 f4 e4 d8 a4 9a 82 59 83 2f 48 91 de eb 6c 26 ef 0b ba 93 f9 e6 6c 78 bc 1a 4f 39 e4 78 74 4f 60 24 4c 01 22 84 b7 6b 67 05 e4 b0 66 9c 9e 3a ef c0 66 cb d9 94 c3 9f 0b 51 59 94 4d 7c 07 60 72 ce 46 58 67 2b 08 b5 74 67 d3 98 3c 25 75 56 fa a4 b0 39 00 23 d1 35 d0 c4 4f ec 13 b2 42 a9 3b d9 31 fb 43 41 1d d8 54 60 9d e8 13 66 13 7e c8 e9 66 cc 66 73 32 21 3a a0 f0 2a 1b 79 db 27 a9 91 8a 11 49 1b a1 01 21 a5 12 9b 3b 21 43 78 04 c0 ac 05 1b 10 74 98 e2 3b 63 33 7c 9d 81 9d e8 ce 35 65 b3 96 09 a9 9c 50 b6 f6 22 01 a8 76 25 2a 87 d3 c9 8a 90 e5 00 ee 55 bb 50 d1 09 05 7e 48 0c d9 db b9 64 cf 93 bc 82 c2 3b 82 29 29 9b 1c 96 25 c6 e6 a1 24 bd 82 6e ae da f0 18 62 41 43 ed e4 5d 5b d6 fc 91 20 03 29 f1 a3 be 17 74 05 03 ea 7b 23 42 52 d4 11 15 ed b4 1e f9 03 65 6c af c5 c9 a8 08 30 c2 34 50 42 79 f4 a9 a0 6c 92 2f 05 8d ba 3c 96 d5 a1 b2 b8 0e 33 63 d8 30 a4 0d 72 86 fc 27 d9 1c 8e 3f a6 a4 62 6c 98 fa de b0 0b 15 28 a2 e4 18 21 8e 4d 92 da 01 e4 74 6d 8f ad e5 18 e1 0a 85 57 70 36 d9 f8 7d 4e d9 cc 3e e7 34 de 82 1f b2 6a 91 e4 aa f5 01 98 78 3d 20 51 86 2d a9 52 2c 98 b1 1b 18 68 bb 19 bf 42 65 c0 23 86 33 d4 9a 92 c6 0d ef b9 4a 78 12 18 50 70 91 51 36 e1 87 8c ef 29 d1 b1 f8 54 f1 5e 79 83 19 ac 4d 27 96 5c ec fa 8c 4a c2 34 b8 4c e2 db c5 f4 2a 1c 06 d6 12 1b f6 fb 1e 89 e5 f0 1c 52 77 4c 14 57 6f 23 47 ab 44 28 c0 e4 22 75 94 cd e0 f5 92 6e 2b e4 dc 28 6a d8 8e cf 2a 35 1e ca b0 89 10 e9 49 ff 6a 24 ff 6f c6 50 4d df 4f e0 4d f2 65 09 5b 68 bd a7 5a ea 94 bc 29 f9 34 a6 4b 79 53 a2 ce 2b c2 cb 70 d5 d7 43 7b a4 b7 e0 3b 0b 44 c8 5d 85 45 b9 69 4c 0a c6 5f 32 c1 52 d9 fc ed d2 ec 33 3b b7 39 75 cd 29 6d c8 5b 53 84 d1 4d 0e d6 bd 88 d1 51 0a 9e c2 61 f6 ca 38 39 1f 27 93 8c 02 30 0e 54 62 26 d2 8b 5b bf f2 bf fe 47 6a 09 ac 72 cb 98 31 7b 99 16 6a 72 04 e3 1f 52 37 fd 25 85 cf 7f ef 13 0e 2e 93 03 c1 0c 14 00 85 76 4a a6 c2 20 4b d9 25 31 d7 82 bd 81 5a 6e 06 53 7f cb 76 9b d5 c7 5b 6d 6d 4b 9a 31 6f 99 52 35 28 6f 7a 90 f1 e2 16 7c 13 dd 88 63 95 e9 2a 56 c8 e4 cb 67 e8 ac 54 b5 88 36 14 45 02 9a 8b 37 e1 55 3b 9b fc 6b 41 d9 64 72 5a 8c 18 32 53 b4 26 1f 8b f0 0c 79 13 e1 2d d2 fb a2 be bf c9 e9 f8 6c 66 59 a3 52 e4 40 f6 ba d4 a8 1c 9d c1 61 08 cd f0 9f b3 cf 4e 8f 8a fa fd 85 9c 3a 3d 6f b9 3d 6f 89 fc 9e 85 87 79 2c 90 e6 9c cd 9c 90 39 d4 bb e7 d5 8b 55 cd 66 c9 ab 20 95 a5 20 59 a2 92 e1 43 11 1d 3d 26 31 a3 8a f8 9b 83 20 27 2e 6c 46 6f c5 88 a9 29 51 99 6a 0b c9 c4 4b 14 ea d2 02 63 2e 07 56 6f 19 bc 9e f3 cf 9a c1 c5 f5 61 66 47 42 46 29 18 04 89 d8 3e 5a 44 75 8d 5e 0f 5b 20 27 2e 6c a6 1f b9 11 d5 d4 19 c3 4b 0e 18 6a 13 c7 9a 4b f4 f0 e6 28 6f c7 ec 85 57 31 67 33 7e 37 43 8e e2 56 c0 92 78 34 98 63 2e 23 61 3c a6 e8 f5 a0 c1 65 e4 02 86 b6 e3 04 15 69 ac a5 0e 45 48 b0 33 62 b9 bd cd da f2 16 f1 d8 ea f7 8b db 94 b3 99 7d c6 4c e7 52 2c d2 e2 a2 f7 8f 08 e1 8e 64 09 12 53 4d d7 e1 d5 dc 91 4d 7a 9f d3 53 e6 1a a1 86 76 6f 2c 16 ec 0f 1c e1 31 2a 21 18 54 7c ef f7 50 0e 2e a7 fc 3c 4c 68 81 fc 21 d0 8b 11 ae 51 b1 18 05 d7 0c f9 6b 28 a2 20 24 cc bf 39 fd 02 86 89 c6 66 4c 5d 73 f3 88 34 18 91 16 b0 9e b7 69 ed e9 07 fc 9d 68 7a 9f 11 32 46 d7 98 cb 35 a2 98 50 5c 35 34 5e 1e ed 35 08 ca c4 1d 0c 8f 6d 62 4a 9d 5e ce 22 fe a9 0c 40 2d 6a 2d bc 63 c0 cc 34 a5 f4 9c 61 fa 71 2e 9f cd 30 d8 90 80 e8 53 15 78 3d 5e 1e 8d e6 4d 8e 87 1d b7 4f a0 b7 75 02 c3 14 dd 2c e8 75 22 e4 06 dd 22 c2 16 22 98 89 25 63 b6 bc 4d 00 82 18 14 3f 9f 3a 54 16 3e 1b e3 9e a2 01 43 f5 59 ab 2f 20 99 7e f3 71 d8 3b 81 f4 77 aa 26 b9 b2 ae b5 f4 1b 7b 9b 48 08 8d 44 ca 8c 92 52 39 6c 7f 02 d3 c7 1f 63 e4 67 77 c9 af 29 75 2f bb aa 72 c9 a9 34 a6 fa 3c 65 ec f2 10 7f 71 eb f4 23 c4 c6 ca 52 bb 17 a7 12 9a f2 c6 1f 7d 0a 0c c7 90 c6 52 ea e8 16 18 02 8f a8 3d 0f 9f 7e 8c cc 4f e1 45 1a 8e 60 86 f2 c3 11 fd 01 94 74 85 f1 3b d7 75 db 26 1a 9b e2 54 35 f7 72 de 86 5a 3c 7a 6c 07 42 b8 9a 2c 6c c0 54 e1 d5 94 7e b3 a4 5f 5b 79 be 34 d0 1e 25 19 21 d5 11 05 3f 75 5b 9b cc aa ab de f6 33 0a 65 f6 43 4b ea 86 c6 d4 f5 5f 8d f5 2f 05 2c bf bf 59 dc c6 a4 37 90 47 10 af 81 e5 b1 d2 c0 1c 0b 19 45 37 f3 73 fd 4f e1 e2 f7 42 4e 5d f3 53 2f fd 71 a0 9e bd 61 78 15 15 a6 5f d5 da 7f b7 95 fd 96 0d 5f 8f f1 e3 0f e7 e7 48 c7 30 83 8b 31 f4 b0 b3 50 b1 a4 4e c7 10 58 a2 35 3d 1e 25 43 b8 94 6d 94 b6 df fb f1 28 ba 3e 47 1a 78 fe 20 ba 99 9d fd 7f 98 9b 0c d4 29 b0 63 f9 0f 5f 4f 20 ff 0d 43 38 fc 4e 14 2e 30 7e 17 76 7a 9a 34 7a 33 79 0a bb 9c 2d 75 7e d0 60 97 2e 6c 44 9e 92 2f 09 5c 12 b2 15 04 43 65 4c d8 02 db 61 2f 1c 73 86 9e db 45 90 ba f0 c3 35 64 a3 df 57 a3 52 04 07 c0 61 e1 d5 75 b3 5d 10 9b 3f 00 93 50 ae 01
PolH V0.08 Id 18927812 Parent 0 Size 00060160
Name Sphere,3
center -0.0186102 -0.00512294 1
x axis 1 0 0
y axis 0 1 0
z axis 0 0 1
Transform
0.999999 0 0 -0.0186102
0 1 0 -0.00512294
0 0 0.999999 8.34465e-007
0 0 0 1
World Vertices 354
0.000000 0.000000 2.000000
0.000000 0.000000 0.000000
0.382683 0.000000 1.923880
0.353553 0.146447 1.923880
0.270598 0.270598 1.923880
0.146447 0.353553 1.923880
0.000000 0.382683 1.923880
-0.146447 0.353553 1.923880
-0.270598 0.270598 1.923880
-0.353553 0.146447 1.923880
-0.382683 0.000000 1.923880
-0.353553 -0.146447 1.923880
-0.270598 -0.270598 1.923880
-0.146447 -0.353553 1.923880
0.000000 -0.382683 1.923880
0.146447 -0.353553 1.923880
0.270598 -0.270598 1.923880
0.353553 -0.146447 1.923880
0.707107 0.000000 1.707107
0.653282 0.270598 1.707107
0.500000 0.500000 1.707107
0.270598 0.653282 1.707107
0.000000 0.707107 1.707107
-0.270598 0.653282 1.707107
-0.500000 0.500000 1.707107
-0.653282 0.270598 1.707107
-0.707107 0.000000 1.707107
-0.653281 -0.270598 1.707107
-0.500000 -0.500000 1.707107
-0.270598 -0.653282 1.707107
0.000000 -0.707107 1.707107
0.270598 -0.653281 1.707107
0.500000 -0.500000 1.707107
0.653282 -0.270598 1.707107
0.923880 0.000000 1.382683
0.853553 0.353553 1.382683
0.653281 0.653282 1.382683
0.353553 0.853553 1.382683
0.000000 0.923880 1.382683
-0.353553 0.853553 1.382683
-0.653282 0.653281 1.382683
-0.853553 0.353553 1.382683
-0.923880 0.000000 1.382683
-0.853553 -0.353553 1.382683
0.000000 -0.923880 1.382683
0.853553 -0.353553 1.382683
1.000000 0.000000 1.000000
0.923880 0.382683 1.000000
0.707107 0.707107 1.000000
0.382683 0.923880 1.000000
0.000000 1.000000 1.000000
-0.382683 0.923880 1.000000
-0.707107 0.707107 1.000000
-0.923880 0.382683 1.000000
-1.000000 0.000000 1.000000
-0.923880 -0.382684 1.000000
0.000000 -1.000000 1.000000
0.923880 -0.382683 1.000000
0.923880 0.000000 0.617316
0.853553 0.353553 0.617316
0.653281 0.653282 0.617316
0.353553 0.853553 0.617316
0.000000 0.923880 0.617316
-0.353553 0.853553 0.617316
-0.653282 0.653281 0.617316
-0.853553 0.353553 0.617316
-0.923880 0.000000 0.617316
-0.853553 -0.353553 0.617316
0.000000 -0.923880 0.617316
0.353554 -0.853553 0.617316
0.853553 -0.353553 0.617316
0.707107 0.000000 0.292893
0.653281 0.270598 0.292893
0.500000 0.500000 0.292893
0.270598 0.653281 0.292893
0.000000 0.707107 0.292893
-0.270598 0.653281 0.292893
-0.500000 0.500000 0.292893
-0.653281 0.270598 0.292893
-0.707107 0.000000 0.292893
-0.653281 -0.270598 0.292893
-0.500000 -0.500000 0.292893
-0.270598 -0.653281 0.292893
0.000000 -0.707107 0.292893
0.270598 -0.653281 0.292893
0.500000 -0.500000 0.292893
0.653282 -0.270598 0.292893
0.382683 0.000000 0.076120
0.353553 0.146447 0.076120
0.270598 0.270598 0.076120
0.146447 0.353553 0.076120
0.000000 0.382683 0.076120
-0.146447 0.353553 0.076120
-0.270598 0.270598 0.076120
-0.353553 0.146447 0.076120
-0.382683 0.000000 0.076120
-0.353553 -0.146447 0.076120
-0.270598 -0.270598 0.076120
-0.146447 -0.353553 0.076120
0.000000 -0.382683 0.076120
0.146447 -0.353553 0.076120
0.270598 -0.270598 0.076120
0.353553 -0.146447 0.076120
-0.349405 -0.843540 0.601095
-0.644725 -0.644725 0.599207
-0.326278 -0.858979 0.617316
-0.671793 -0.625576 0.617316
-0.140096 -0.972133 1.000000
-0.848633 -0.495298 1.000000
-0.269163 -0.870340 1.382683
-0.339748 -0.820225 1.436672
-0.704704 -0.576322 1.382683
-0.626280 -0.626281 1.439831
-0.554173 -0.690170 0.580100
-0.430941 -0.772729 0.580377
-0.650260 -0.639687 0.601958
-0.699209 -0.597166 0.653255
-0.347305 -0.844534 0.601958
-0.291249 -0.872839 0.651967
-0.785117 -0.520380 0.800722
-0.187276 -0.923110 0.800722
-0.845288 -0.487950 1.035181
-0.134640 -0.966220 1.035181
-0.770558 -0.517460 1.269639
-0.699209 -0.578492 1.387816
-0.542095 -0.660769 1.467443
-0.408685 -0.750289 1.466963
-0.190150 -0.908542 1.269639
-0.273780 -0.865543 1.388488
-0.699209 -1.043224 1.647850
-0.699209 -1.043224 0.422511
-0.477345 -1.043224 1.601213
-0.494233 -0.957615 1.601213
-0.542327 -0.885040 1.601213
-0.614305 -0.836547 1.601213
-0.699209 -0.819518 1.601213
-0.784113 -0.836547 1.601213
-0.856091 -0.885040 1.601213
-0.904185 -0.957615 1.601213
-0.921074 -1.043224 1.601213
-0.904185 -1.128832 1.601213
-0.856091 -1.201408 1.601213
-0.784113 -1.249901 1.601213
-0.699209 -1.266930 1.601213
-0.614305 -1.249901 1.601213
-0.542327 -1.201408 1.601213
-0.494233 -1.128832 1.601213
-0.289257 -1.043224 1.468403
-0.320463 -0.885040 1.468403
-0.409329 -0.750938 1.468403
-0.542327 -0.661334 1.468403
-0.699209 -0.629869 1.468403
-0.856091 -0.661334 1.468403
-0.989089 -0.750938 1.468403
-1.077956 -0.885040 1.468403
-1.109161 -1.043224 1.468403
-1.077956 -1.201408 1.468403
-0.989089 -1.335510 1.468403
-0.856091 -1.425114 1.468403
-0.699209 -1.456578 1.468403
-0.542327 -1.425114 1.468403
-0.409329 -1.335510 1.468403
-0.320463 -1.201408 1.468403
-0.163581 -1.043224 1.269639
-0.904185 -0.544261 1.269639
-1.077956 -0.661334 1.269639
-1.194065 -0.836547 1.269639
-1.234838 -1.043224 1.269639
-1.194065 -1.249901 1.269639
-1.077956 -1.425114 1.269639
-0.904185 -1.542187 1.269639
-0.699209 -1.583298 1.269639
-0.494233 -1.542187 1.269639
-0.320463 -1.425114 1.269639
-0.204353 -1.249901 1.269639
-0.119449 -1.043224 1.035181
-0.921074 -0.503150 1.035181
-1.109161 -0.629869 1.035181
-1.234838 -0.819518 1.035181
-1.278969 -1.043224 1.035181
-1.234838 -1.266930 1.035181
-1.109161 -1.456578 1.035181
-0.921074 -1.583298 1.035181
-0.699209 -1.627796 1.035181
-0.477345 -1.583298 1.035181
-0.289257 -1.456578 1.035181
-0.163581 -1.266930 1.035181
-0.163581 -1.043224 0.800722
-0.904185 -0.544261 0.800722
-1.077956 -0.661334 0.800722
-1.194065 -0.836547 0.800722
-1.234838 -1.043224 0.800722
-1.194065 -1.249901 0.800722
-1.077956 -1.425114 0.800722
-0.904185 -1.542187 0.800722
-0.699209 -1.583298 0.800722
-0.494233 -1.542187 0.800722
-0.320463 -1.425114 0.800722
-0.204353 -1.249901 0.800722
-0.289257 -1.043224 0.601958
-0.320463 -0.885040 0.601958
-0.699209 -0.629869 0.601958
-0.856091 -0.661334 0.601958
-0.989089 -0.750938 0.601958
-1.077956 -0.885040 0.601958
-1.109161 -1.043224 0.601958
-1.077956 -1.201408 0.601958
-0.989089 -1.335510 0.601958
-0.856091 -1.425114 0.601958
-0.699209 -1.456578 0.601958
-0.542327 -1.425114 0.601958
-0.409329 -1.335510 0.601958
-0.320463 -1.201408 0.601958
-0.477345 -1.043224 0.469148
-0.494233 -0.957615 0.469148
-0.542327 -0.885040 0.469148
-0.614305 -0.836547 0.469148
-0.699209 -0.819518 0.469148
-0.784113 -0.836547 0.469148
-0.856091 -0.885040 0.469148
-0.904185 -0.957615 0.469148
-0.921074 -1.043224 0.469148
-0.904185 -1.128832 0.469148
-0.856091 -1.201408 0.469148
-0.784113 -1.249901 0.469148
-0.699209 -1.266930 0.469148
-0.614305 -1.249901 0.469148
-0.542327 -1.201408 0.469148
-0.494233 -1.128832 0.469148
0.351676 -0.849020 1.390027
0.644376 -0.644376 0.598468
0.672931 -0.623874 0.617316
0.428971 -0.803161 0.617316
0.357333 -0.862679 0.666974
0.867677 -0.466796 1.000000
0.216668 -0.956902 1.000000
0.707542 -0.572074 1.382683
0.625703 -0.625702 1.441055
0.345736 -0.855108 1.382683
0.493844 -0.741717 0.594355
0.623507 -0.654850 0.594065
0.463925 -0.767700 0.601958
0.365454 -0.854815 0.656584
0.651398 -0.637984 0.601958
0.776111 -0.516950 0.752572
0.263849 -0.907878 0.800722
0.804161 -0.491878 0.800722
0.211213 -0.950989 1.035181
0.864332 -0.459448 1.035181
0.266723 -0.893311 1.269639
0.475560 -0.723281 1.444536
0.613574 -0.630671 1.445033
0.776111 -0.501018 1.292799
0.789603 -0.488958 1.269639
0.776111 -1.026326 1.647850
0.776111 -1.026326 0.422511
0.997975 -1.026326 1.601213
0.981087 -0.940718 1.601213
0.932993 -0.868142 1.601213
0.861015 -0.819649 1.601213
0.776111 -0.802620 1.601213
0.691207 -0.819649 1.601213
0.619229 -0.868142 1.601213
0.571135 -0.940718 1.601213
0.554246 -1.026326 1.601213
0.571135 -1.111935 1.601213
0.619229 -1.184510 1.601213
0.691207 -1.233003 1.601213
0.776111 -1.250032 1.601213
0.861015 -1.233003 1.601213
0.932993 -1.184510 1.601213
0.981087 -1.111935 1.601213
1.186063 -1.026326 1.468403
1.154857 -0.868142 1.468403
1.065991 -0.734040 1.468403
0.932993 -0.644436 1.468403
0.776111 -0.612972 1.468403
0.619229 -0.644436 1.468403
0.486231 -0.734040 1.468403
0.397364 -0.868142 1.468403
0.366158 -1.026326 1.468403
0.397364 -1.184510 1.468403
0.486231 -1.318612 1.468403
0.619229 -1.408216 1.468403
0.776111 -1.439681 1.468403
0.932993 -1.408216 1.468403
1.065991 -1.318612 1.468403
1.154857 -1.184510 1.468403
1.311739 -1.026326 1.269639
1.270967 -0.819649 1.269639
1.154857 -0.644436 1.269639
0.981087 -0.527363 1.269639
0.240482 -1.026326 1.269639
0.281255 -1.233003 1.269639
0.397364 -1.408216 1.269639
0.571135 -1.525289 1.269639
0.776111 -1.566400 1.269639
0.981087 -1.525289 1.269639
1.154857 -1.408216 1.269639
1.270967 -1.233003 1.269639
1.355871 -1.026326 1.035181
1.311739 -0.802620 1.035181
1.186063 -0.612972 1.035181
0.997975 -0.486252 1.035181
0.196351 -1.026326 1.035181
0.240482 -1.250032 1.035181
0.366158 -1.439681 1.035181
0.554246 -1.566400 1.035181
0.776111 -1.610898 1.035181
0.997975 -1.566400 1.035181
1.186063 -1.439681 1.035181
1.311739 -1.250032 1.035181
1.311739 -1.026326 0.800722
1.270967 -0.819649 0.800722
1.154857 -0.644436 0.800722
0.981087 -0.527363 0.800722
0.240482 -1.026326 0.800722
0.281255 -1.233003 0.800722
0.397364 -1.408216 0.800722
0.571135 -1.525289 0.800722
0.776111 -1.566400 0.800722
0.981087 -1.525289 0.800722
1.154857 -1.408216 0.800722
1.270967 -1.233003 0.800722
1.186063 -1.026326 0.601958
1.154857 -0.868142 0.601958
1.065991 -0.734040 0.601958
0.932993 -0.644436 0.601958
0.776111 -0.612972 0.601958
0.397364 -0.868142 0.601958
0.366158 -1.026326 0.601958
0.397364 -1.184510 0.601958
0.486231 -1.318612 0.601958
0.619229 -1.408216 0.601958
0.776111 -1.439681 0.601958
0.932993 -1.408216 0.601958
1.065991 -1.318612 0.601958
1.154857 -1.184510 0.601958
0.997975 -1.026326 0.469148
0.981087 -0.940718 0.469148
0.932993 -0.868142 0.469148
0.861014 -0.819649 0.469148
0.776111 -0.802620 0.469148
0.691207 -0.819649 0.469148
0.619229 -0.868142 0.469148
0.571135 -0.940718 0.469148
0.554246 -1.026326 0.469148
0.571135 -1.111935 0.469148
0.619229 -1.184510 0.469148
0.691207 -1.233003 0.469148
0.776111 -1.250032 0.469148
0.861015 -1.233003 0.469148
0.932993 -1.184510 0.469148
0.981087 -1.111935 0.469148
Texture Vertices 566
0.031250 1.000000
0.093750 1.000000
0.156250 1.000000
0.218750 1.000000
0.281250 1.000000
0.343750 1.000000
0.406250 1.000000
0.468750 1.000000
0.531250 1.000000
0.593750 1.000000
0.656250 1.000000
0.718750 1.000000
0.781250 1.000000
0.843750 1.000000
0.906250 1.000000
0.968750 1.000000
0.031250 0.000000
0.093750 0.000000
0.156250 0.000000
0.218750 0.000000
0.281250 0.000000
0.343750 0.000000
0.406250 0.000000
0.000000 0.875000
1.000000 0.875000
0.468750 0.000000
0.531250 0.000000
0.593750 0.000000
0.656250 0.000000
0.718750 0.000000
0.781250 0.000000
0.062500 0.875000
0.843750 0.000000
0.906250 0.000000
0.968750 0.000000
0.937500 0.125000
0.125000 0.875000
0.187500 0.875000
0.250000 0.875000
0.312500 0.875000
0.375000 0.875000
0.437500 0.875000
0.500000 0.875000
0.562500 0.875000
0.625000 0.875000
0.687500 0.875000
0.750000 0.875000
0.812500 0.875000
0.875000 0.875000
0.937500 0.875000
0.000000 0.750000
1.000000 0.750000
0.062500 0.750000
0.125000 0.750000
0.187500 0.750000
0.250000 0.750000
0.312500 0.750000
0.375000 0.750000
0.437500 0.750000
0.500000 0.750000
0.562500 0.750000
0.625000 0.750000
0.687500 0.750000
0.750000 0.750000
0.812500 0.750000
0.875000 0.750000
0.937500 0.750000
0.000000 0.625000
1.000000 0.625000
0.062500 0.625000
0.125000 0.625000
0.187500 0.625000
0.250000 0.625000
0.312500 0.625000
0.375000 0.625000
0.437500 0.625000
0.500000 0.625000
0.562500 0.625000
0.750000 0.625000
0.812500 0.627829
0.875000 0.647491
0.891933 0.625000
0.937500 0.625000
0.000000 0.500000
1.000000 0.500000
0.062500 0.500000
0.125000 0.500000
0.187500 0.500000
0.250000 0.500000
0.312500 0.500000
0.375000 0.500000
0.437500 0.500000
0.500000 0.500000
0.562500 0.500000
0.750000 0.500000
0.921296 0.500000
0.937500 0.500000
0.000000 0.375000
1.000000 0.375000
0.062500 0.375000
0.125000 0.375000
0.187500 0.375000
0.250000 0.375000
0.312500 0.375000
0.375000 0.375000
0.437500 0.375000
0.500000 0.375000
0.562500 0.375000
0.750000 0.375000
0.812500 0.375000
0.881132 0.375000
0.937500 0.375000
0.000000 0.250000
1.000000 0.250000
0.062500 0.250000
0.125000 0.250000
0.187500 0.250000
0.250000 0.250000
0.312500 0.250000
0.375000 0.250000
0.437500 0.250000
0.500000 0.250000
0.562500 0.250000
0.625000 0.250000
0.687500 0.250000
0.750000 0.250000
0.812500 0.250000
0.875000 0.250000
0.937500 0.250000
1.000000 0.125000
0.000000 0.125000
0.062500 0.125000
0.125000 0.125000
0.187500 0.125000
0.250000 0.125000
0.312500 0.125000
0.375000 0.125000
0.437500 0.125000
0.500000 0.125000
0.562500 0.125000
0.625000 0.125000
0.687500 0.125000
0.750000 0.125000
0.812500 0.125000
0.875000 0.125000
0.937500 0.125000
0.687500 0.368750
0.079054 0.249086
0.079054 0.249086
0.625000 0.368022
0.230893 0.247444
0.230893 0.247444
0.692322 0.375000
0.074895 0.259539
0.074895 0.259539
0.619223 0.375000
0.236962 0.259707
0.236962 0.259707
0.727120 0.500000
0.019796 0.481231
0.019796 0.481231
0.584195 0.500000
0.292879 0.481231
0.292879 0.481231
0.702418 0.625000
0.059791 0.696016
0.059791 0.696016
0.687500 0.645802
0.088284 0.730079
0.088284 0.730079
0.608952 0.625000
0.252478 0.696016
0.252478 0.696016
0.625000 0.647019
0.221801 0.732023
0.221801 0.732023
0.641059 0.360661
0.641059 0.360661
0.187500 0.229427
0.670194 0.360767
0.670194 0.360767
0.125000 0.229688
0.627263 0.369082
0.627263 0.369082
0.230499 0.250000
0.611745 0.386739
0.611745 0.386739
0.250000 0.282260
0.081378 0.250000
0.684205 0.369082
0.684205 0.369082
0.062500 0.281450
0.699538 0.386318
0.699538 0.386318
0.593166 0.434908
0.593166 0.434908
0.276194 0.375000
0.718152 0.434908
0.718152 0.434908
0.036323 0.375000
0.583109 0.511491
0.583109 0.511491
0.291151 0.500000
0.021514 0.500000
0.728150 0.511491
0.728150 0.511491
0.271755 0.625000
0.594109 0.588075
0.594109 0.588075
0.611927 0.626977
0.611927 0.626977
0.250000 0.699320
0.639823 0.657658
0.639823 0.657658
0.187500 0.749396
0.125000 0.749094
0.671380 0.657473
0.671380 0.657473
0.717210 0.588075
0.717210 0.588075
0.040728 0.625000
0.699174 0.627237
0.699174 0.627237
0.062500 0.699743
0.031250 1.000000
0.093750 1.000000
0.156250 1.000000
0.218750 1.000000
0.281250 1.000000
0.343750 1.000000
0.406250 1.000000
0.468750 1.000000
0.531250 1.000000
0.593750 1.000000
0.656250 1.000000
0.718750 1.000000
0.781250 1.000000
0.843750 1.000000
0.906250 1.000000
0.968750 1.000000
0.031250 0.000000
0.093750 0.000000
0.156250 0.000000
0.218750 0.000000
0.281250 0.000000
0.343750 0.000000
0.406250 0.000000
0.000000 0.875000
1.000000 0.875000
0.468750 0.000000
0.531250 0.000000
0.593750 0.000000
0.656250 0.000000
0.718750 0.000000
0.781250 0.000000
0.843750 0.000000
0.906250 0.000000
0.062500 0.875000
0.968750 0.000000
0.125000 0.875000
0.187500 0.875000
0.250000 0.875000
0.312500 0.875000
0.375000 0.875000
0.437500 0.875000
0.500000 0.875000
0.562500 0.875000
0.625000 0.875000
0.687500 0.875000
0.750000 0.875000
0.812500 0.875000
0.875000 0.875000
0.937500 0.875000
0.000000 0.750000
1.000000 0.750000
0.062500 0.750000
0.125000 0.750000
0.187500 0.750000
0.250000 0.750000
0.312500 0.750000
0.375000 0.750000
0.437500 0.750000
0.500000 0.750000
0.562500 0.750000
0.625000 0.750000
0.687500 0.750000
0.750000 0.750000
0.812500 0.750000
0.875000 0.750000
0.937500 0.750000
0.000000 0.625000
1.000000 0.625000
0.312500 0.625000
0.375000 0.625000
0.437500 0.625000
0.500000 0.625000
0.562500 0.625000
0.625000 0.625000
0.687500 0.625000
0.750000 0.625000
0.812500 0.625000
0.875000 0.625000
0.937500 0.625000
0.000000 0.500000
1.000000 0.500000
0.312500 0.500000
0.375000 0.500000
0.437500 0.500000
0.500000 0.500000
0.562500 0.500000
0.625000 0.500000
0.687500 0.500000
0.750000 0.500000
0.812500 0.500000
0.875000 0.500000
0.937500 0.500000
0.000000 0.375000
1.000000 0.375000
0.312500 0.375000
0.375000 0.375000
0.437500 0.375000
0.500000 0.375000
0.562500 0.375000
0.625000 0.375000
0.687500 0.375000
0.750000 0.375000
0.812500 0.375000
0.875000 0.375000
0.937500 0.375000
0.000000 0.250000
1.000000 0.250000
0.062500 0.250000
0.250000 0.250000
0.312500 0.250000
0.375000 0.250000
0.437500 0.250000
0.500000 0.250000
0.562500 0.250000
0.625000 0.250000
0.687500 0.250000
0.750000 0.250000
0.812500 0.250000
0.875000 0.250000
0.937500 0.250000
1.000000 0.125000
0.000000 0.125000
0.062500 0.125000
0.125000 0.125000
0.187500 0.125000
0.250000 0.125000
0.312500 0.125000
0.375000 0.125000
0.437500 0.125000
0.500000 0.125000
0.562500 0.125000
0.625000 0.125000
0.687500 0.125000
0.750000 0.125000
0.812500 0.125000
0.875000 0.125000
0.811118 0.625000
0.785386 0.500000
0.812500 0.391220
0.828226 0.375000
0.875000 0.367738
0.031250 1.000000
0.093750 1.000000
0.156250 1.000000
0.218750 1.000000
0.281250 1.000000
0.343750 1.000000
0.406250 1.000000
0.468750 1.000000
0.531250 1.000000
0.593750 1.000000
0.656250 1.000000
0.718750 1.000000
0.781250 1.000000
0.843750 1.000000
0.906250 1.000000
0.968750 1.000000
0.937500 0.125000
0.031250 0.000000
0.093750 0.000000
0.000000 0.875000
1.000000 0.875000
0.156250 0.000000
0.218750 0.000000
0.281250 0.000000
0.343750 0.000000
0.406250 0.000000
0.468750 0.000000
0.062500 0.875000
0.531250 0.000000
0.593750 0.000000
0.656250 0.000000
0.718750 0.000000
0.781250 0.000000
0.843750 0.000000
0.906250 0.000000
0.125000 0.875000
0.968750 0.000000
0.187500 0.875000
0.250000 0.875000
0.312500 0.875000
0.375000 0.875000
0.437500 0.875000
0.500000 0.875000
0.562500 0.875000
0.625000 0.875000
0.687500 0.875000
0.750000 0.875000
0.812500 0.875000
0.875000 0.875000
0.937500 0.875000
0.000000 0.750000
1.000000 0.750000
0.062500 0.750000
0.125000 0.750000
0.187500 0.750000
0.250000 0.750000
0.312500 0.750000
0.375000 0.750000
0.437500 0.750000
0.500000 0.750000
0.562500 0.750000
0.625000 0.750000
0.687500 0.750000
0.750000 0.750000
0.812500 0.750000
0.875000 0.750000
0.937500 0.750000
0.000000 0.625000
1.000000 0.625000
0.062500 0.625000
0.125000 0.625000
0.187500 0.625000
0.250000 0.639565
0.312500 0.735303
0.375000 0.734990
0.437500 0.700735
0.459776 0.625000
0.500000 0.625000
0.562500 0.625000
0.625000 0.625000
0.687500 0.625000
0.750000 0.625000
0.812500 0.625000
0.875000 0.625000
0.937500 0.625000
0.000000 0.500000
1.000000 0.500000
0.062500 0.500000
0.125000 0.500000
0.187500 0.500000
0.478952 0.500000
0.500000 0.500000
0.562500 0.500000
0.625000 0.500000
0.687500 0.500000
0.750000 0.500000
0.812500 0.500000
0.875000 0.500000
0.937500 0.500000
0.000000 0.375000
1.000000 0.375000
0.062500 0.375000
0.125000 0.375000
0.187500 0.375000
0.464181 0.375000
0.500000 0.375000
0.562500 0.375000
0.625000 0.375000
0.687500 0.375000
0.750000 0.375000
0.812500 0.375000
0.875000 0.375000
0.937500 0.375000
0.000000 0.250000
1.000000 0.250000
0.062500 0.250000
0.125000 0.250000
0.187500 0.250000
0.250000 0.250000
0.390688 0.250000
0.437500 0.250000
0.500000 0.250000
0.562500 0.250000
0.625000 0.250000
0.687500 0.250000
0.750000 0.250000
0.812500 0.250000
0.875000 0.250000
0.937500 0.250000
1.000000 0.125000
0.000000 0.125000
0.062500 0.125000
0.125000 0.125000
0.187500 0.125000
0.250000 0.125000
0.312500 0.125000
0.375000 0.125000
0.437500 0.125000
0.500000 0.125000
0.562500 0.125000
0.625000 0.125000
0.687500 0.125000
0.750000 0.125000
0.812500 0.125000
0.875000 0.125000
0.245886 0.625000
0.225148 0.500000
0.241447 0.375000
0.250000 0.344719
0.299684 0.250000
0.437500 0.284353
0.312500 0.242571
0.375000 0.242844
0.784851 0.511491
0.784851 0.511491
0.480688 0.481231
0.480688 0.481231
0.795791 0.588075
0.795791 0.588075
0.440779 0.696018
0.440779 0.696018
0.794848 0.434908
0.794848 0.434908
0.442522 0.290957
0.442522 0.290957
0.815267 0.387826
0.815267 0.387826
0.409377 0.259640
0.409377 0.259640
0.842489 0.648832
0.842489 0.648832
0.835741 0.369082
0.835741 0.369082
0.875136 0.649023
0.875136 0.649023
0.843463 0.366153
0.843463 0.366153
0.874119 0.366041
0.874119 0.366041
0.309150 0.246637
0.309150 0.246637
0.873139 0.369082
0.873139 0.369082
0.289210 0.259638
0.289210 0.259638
0.305016 0.732864
0.305016 0.732864
0.908682 0.595640
0.908682 0.595640
0.274266 0.696074
0.274266 0.696074
0.911600 0.588075
0.911600 0.588075
0.906476 0.419180
0.906476 0.419180
0.922599 0.511491
0.922599 0.511491
0.912542 0.434908
0.912542 0.434908
0.224064 0.481249
0.224064 0.481249
Faces 704
Face verts 3 flags 0 mat 0
<0,0> <3,31> <2,23>
Face verts 3 flags 0 mat 0
<0,1> <4,36> <3,31>
Face verts 3 flags 0 mat 0
<0,2> <5,37> <4,36>
Face verts 3 flags 0 mat 0
<6,38> <5,37> <0,3>
Face verts 3 flags 0 mat 0
<7,39> <6,38> <0,4>
Face verts 3 flags 0 mat 0
<8,40> <7,39> <0,5>
Face verts 3 flags 0 mat 0
<9,41> <8,40> <0,6>
Face verts 3 flags 0 mat 0
<10,42> <9,41> <0,7>
Face verts 3 flags 0 mat 0
<10,42> <0,8> <11,43>
Face verts 3 flags 0 mat 0
<11,43> <0,9> <12,44>
Face verts 3 flags 0 mat 0
<12,44> <0,10> <13,45>
Face verts 3 flags 0 mat 0
<13,45> <0,11> <14,46>
Face verts 3 flags 0 mat 0
<0,12> <15,47> <14,46>
Face verts 3 flags 0 mat 0
<0,13> <16,48> <15,47>
Face verts 3 flags 0 mat 0
<0,14> <17,49> <16,48>
Face verts 3 flags 0 mat 0
<0,15> <2,24> <17,49>
Face verts 3 flags 0 mat 0
<19,52> <18,50> <2,23>
Face verts 3 flags 0 mat 0
<19,52> <2,23> <3,31>
Face verts 3 flags 0 mat 0
<20,53> <19,52> <3,31>
Face verts 3 flags 0 mat 0
<20,53> <3,31> <4,36>
Face verts 3 flags 0 mat 0
<5,37> <21,54> <20,53>
Face verts 3 flags 0 mat 0
<5,37> <20,53> <4,36>
Face verts 3 flags 0 mat 0
<22,55> <21,54> <5,37>
Face verts 3 flags 0 mat 0
<22,55> <5,37> <6,38>
Face verts 3 flags 0 mat 0
<7,39> <23,56> <22,55>
Face verts 3 flags 0 mat 0
<7,39> <22,55> <6,38>
Face verts 3 flags 0 mat 0
<8,40> <24,57> <23,56>
Face verts 3 flags 0 mat 0
<8,40> <23,56> <7,39>
Face verts 3 flags 0 mat 0
<25,58> <24,57> <8,40>
Face verts 3 flags 0 mat 0
<25,58> <8,40> <9,41>
Face verts 3 flags 0 mat 0
<10,42> <26,59> <25,58>
Face verts 3 flags 0 mat 0
<10,42> <25,58> <9,41>
Face verts 3 flags 0 mat 0
<27,60> <26,59> <10,42>
Face verts 3 flags 0 mat 0
<27,60> <10,42> <11,43>
Face verts 3 flags 0 mat 0
<12,44> <28,61> <27,60>
Face verts 3 flags 0 mat 0
<12,44> <27,60> <11,43>
Face verts 3 flags 0 mat 0
<29,62> <28,61> <12,44>
Face verts 3 flags 0 mat 0
<29,62> <12,44> <13,45>
Face verts 3 flags 0 mat 0
<14,46> <30,63> <29,62>
Face verts 3 flags 0 mat 0
<14,46> <29,62> <13,45>
Face verts 3 flags 0 mat 0
<15,47> <31,64> <30,63>
Face verts 3 flags 0 mat 0
<15,47> <30,63> <14,46>
Face verts 3 flags 0 mat 0
<32,65> <31,64> <15,47>
Face verts 3 flags 0 mat 0
<32,65> <15,47> <16,48>
Face verts 3 flags 0 mat 0
<17,49> <33,66> <32,65>
Face verts 3 flags 0 mat 0
<17,49> <32,65> <16,48>
Face verts 3 flags 0 mat 0
<2,24> <18,51> <33,66>
Face verts 3 flags 0 mat 0
<2,24> <33,66> <17,49>
Face verts 3 flags 0 mat 0
<19,52> <35,69> <34,67>
Face verts 3 flags 0 mat 0
<19,52> <34,67> <18,50>
Face verts 3 flags 0 mat 0
<20,53> <36,70> <35,69>
Face verts 3 flags 0 mat 0
<20,53> <35,69> <19,52>
Face verts 3 flags 0 mat 0
<21,54> <37,71> <36,70>
Face verts 3 flags 0 mat 0
<21,54> <36,70> <20,53>
Face verts 3 flags 0 mat 0
<38,72> <37,71> <21,54>
Face verts 3 flags 0 mat 0
<38,72> <21,54> <22,55>
Face verts 3 flags 0 mat 0
<23,56> <39,73> <38,72>
Face verts 3 flags 0 mat 0
<23,56> <38,72> <22,55>
Face verts 3 flags 0 mat 0
<40,74> <39,73> <23,56>
Face verts 3 flags 0 mat 0
<40,74> <23,56> <24,57>
Face verts 3 flags 0 mat 0
<41,75> <40,74> <24,57>
Face verts 3 flags 0 mat 0
<41,75> <24,57> <25,58>
Face verts 3 flags 0 mat 0
<26,59> <42,76> <41,75>
Face verts 3 flags 0 mat 0
<26,59> <41,75> <25,58>
Face verts 3 flags 0 mat 0
<43,77> <42,76> <26,59>
Face verts 3 flags 0 mat 0
<43,77> <26,59> <27,60>
Face verts 3 flags 0 mat 0
<55,93> <108,161> <119,194>
Face verts 3 flags 0 mat 0
<67,107> <55,93> <119,194>
Face verts 3 flags 0 mat 0
<67,107> <119,194> <116,185>
Face verts 3 flags 0 mat 0
<67,107> <116,185> <106,155>
Face verts 3 flags 0 mat 0
<30,63> <31,64> <229,79>
Face verts 3 flags 0 mat 0
<44,78> <30,63> <229,79>
Face verts 3 flags 0 mat 0
<44,78> <229,79> <238,360>
Face verts 3 flags 0 mat 0
<33,66> <45,82> <236,81>
Face verts 3 flags 0 mat 0
<237,80> <32,65> <33,66>
Face verts 3 flags 0 mat 0
<237,80> <33,66> <236,81>
Face verts 3 flags 0 mat 0
<34,68> <45,82> <33,66>
Face verts 3 flags 0 mat 0
<34,68> <33,66> <18,51>
Face verts 3 flags 0 mat 0
<35,69> <47,85> <46,83>
Face verts 3 flags 0 mat 0
<35,69> <46,83> <34,67>
Face verts 3 flags 0 mat 0
<48,86> <47,85> <35,69>
Face verts 3 flags 0 mat 0
<48,86> <35,69> <36,70>
Face verts 3 flags 0 mat 0
<49,87> <48,86> <36,70>
Face verts 3 flags 0 mat 0
<49,87> <36,70> <37,71>
Face verts 3 flags 0 mat 0
<50,88> <49,87> <37,71>
Face verts 3 flags 0 mat 0
<50,88> <37,71> <38,72>
Face verts 3 flags 0 mat 0
<51,89> <50,88> <38,72>
Face verts 3 flags 0 mat 0
<51,89> <38,72> <39,73>
Face verts 3 flags 0 mat 0
<40,74> <52,90> <51,89>
Face verts 3 flags 0 mat 0
<40,74> <51,89> <39,73>
Face verts 3 flags 0 mat 0
<41,75> <53,91> <52,90>
Face verts 3 flags 0 mat 0
<41,75> <52,90> <40,74>
Face verts 3 flags 0 mat 0
<54,92> <53,91> <41,75>
Face verts 3 flags 0 mat 0
<54,92> <41,75> <42,76>
Face verts 3 flags 0 mat 0
<55,93> <54,92> <42,76>
Face verts 3 flags 0 mat 0
<55,93> <42,76> <43,77>
Face verts 3 flags 0 mat 0
<34,68> <46,84> <57,96>
Face verts 3 flags 0 mat 0
<34,68> <57,96> <45,82>
Face verts 3 flags 0 mat 0
<46,83> <47,85> <59,99>
Face verts 3 flags 0 mat 0
<46,83> <59,99> <58,97>
Face verts 3 flags 0 mat 0
<59,99> <47,85> <48,86>
Face verts 3 flags 0 mat 0
<59,99> <48,86> <60,100>
Face verts 3 flags 0 mat 0
<60,100> <48,86> <49,87>
Face verts 3 flags 0 mat 0
<60,100> <49,87> <61,101>
Face verts 3 flags 0 mat 0
<49,87> <50,88> <62,102>
Face verts 3 flags 0 mat 0
<49,87> <62,102> <61,101>
Face verts 3 flags 0 mat 0
<50,88> <51,89> <63,103>
Face verts 3 flags 0 mat 0
<50,88> <63,103> <62,102>
Face verts 3 flags 0 mat 0
<51,89> <52,90> <64,104>
Face verts 3 flags 0 mat 0
<51,89> <64,104> <63,103>
Face verts 3 flags 0 mat 0
<52,90> <53,91> <65,105>
Face verts 3 flags 0 mat 0
<52,90> <65,105> <64,104>
Face verts 3 flags 0 mat 0
<65,105> <53,91> <54,92>
Face verts 3 flags 0 mat 0
<65,105> <54,92> <66,106>
Face verts 3 flags 0 mat 0
<66,106> <54,92> <55,93>
Face verts 3 flags 0 mat 0
<66,106> <55,93> <67,107>
Face verts 3 flags 0 mat 0
<80,122> <67,107> <106,155>
Face verts 3 flags 0 mat 0
<81,123> <80,122> <106,155>
Face verts 3 flags 0 mat 0
<81,123> <106,155> <115,182>
Face verts 3 flags 0 mat 0
<81,123> <115,182> <104,149>
Face verts 3 flags 0 mat 0
<120,197> <107,158> <56,94>
Face verts 3 flags 0 mat 0
<120,197> <56,94> <68,108>
Face verts 3 flags 0 mat 0
<118,192> <120,197> <68,108>
Face verts 3 flags 0 mat 0
<118,192> <68,108> <105,152>
Face verts 3 flags 0 mat 0
<57,96> <46,84> <58,98>
Face verts 3 flags 0 mat 0
<57,96> <58,98> <70,111>
Face verts 3 flags 0 mat 0
<58,97> <59,99> <72,114>
Face verts 3 flags 0 mat 0
<58,97> <72,114> <71,112>
Face verts 3 flags 0 mat 0
<59,99> <60,100> <73,115>
Face verts 3 flags 0 mat 0
<59,99> <73,115> <72,114>
Face verts 3 flags 0 mat 0
<60,100> <61,101> <74,116>
Face verts 3 flags 0 mat 0
<60,100> <74,116> <73,115>
Face verts 3 flags 0 mat 0
<74,116> <61,101> <62,102>
Face verts 3 flags 0 mat 0
<74,116> <62,102> <75,117>
Face verts 3 flags 0 mat 0
<62,102> <63,103> <76,118>
Face verts 3 flags 0 mat 0
<62,102> <76,118> <75,117>
Face verts 3 flags 0 mat 0
<63,103> <64,104> <77,119>
Face verts 3 flags 0 mat 0
<63,103> <77,119> <76,118>
Face verts 3 flags 0 mat 0
<77,119> <64,104> <65,105>
Face verts 3 flags 0 mat 0
<77,119> <65,105> <78,120>
Face verts 3 flags 0 mat 0
<78,120> <65,105> <66,106>
Face verts 3 flags 0 mat 0
<78,120> <66,106> <79,121>
Face verts 3 flags 0 mat 0
<66,106> <67,107> <80,122>
Face verts 3 flags 0 mat 0
<66,106> <80,122> <79,121>
Face verts 3 flags 0 mat 0
<68,108> <69,109> <84,126>
Face verts 3 flags 0 mat 0
<68,108> <84,126> <83,125>
Face verts 3 flags 0 mat 0
<231,110> <70,111> <86,128>
Face verts 3 flags 0 mat 0
<231,110> <86,128> <85,127>
Face verts 3 flags 0 mat 0
<243,546> <231,110> <85,127>
Face verts 3 flags 0 mat 0
<243,546> <85,127> <230,364>
Face verts 3 flags 0 mat 0
<86,128> <70,111> <58,98>
Face verts 3 flags 0 mat 0
<86,128> <58,98> <71,113>
Face verts 3 flags 0 mat 0
<128,221> <110,167> <29,62>
Face verts 3 flags 0 mat 0
<128,221> <29,62> <30,63>
Face verts 3 flags 0 mat 0
<128,221> <30,63> <44,78>
Face verts 3 flags 0 mat 0
<128,221> <44,78> <109,164>
Face verts 3 flags 0 mat 0
<71,112> <72,114> <88,131>
Face verts 3 flags 0 mat 0
<71,112> <88,131> <87,130>
Face verts 3 flags 0 mat 0
<88,131> <72,114> <73,115>
Face verts 3 flags 0 mat 0
<88,131> <73,115> <89,132>
Face verts 3 flags 0 mat 0
<29,62> <110,167> <126,216>
Face verts 3 flags 0 mat 0
<28,61> <29,62> <126,216>
Face verts 3 flags 0 mat 0
<28,61> <126,216> <125,212>
Face verts 3 flags 0 mat 0
<28,61> <125,212> <112,173>
Face verts 3 flags 0 mat 0
<73,115> <74,116> <90,133>
Face verts 3 flags 0 mat 0
<73,115> <90,133> <89,132>
Face verts 3 flags 0 mat 0
<114,179> <103,146> <82,124>
Face verts 3 flags 0 mat 0
<114,179> <82,124> <81,123>
Face verts 3 flags 0 mat 0
<113,176> <114,179> <81,123>
Face verts 3 flags 0 mat 0
<113,176> <81,123> <104,149>
Face verts 3 flags 0 mat 0
<90,133> <74,116> <75,117>
Face verts 3 flags 0 mat 0
<90,133> <75,117> <91,134>
Face verts 3 flags 0 mat 0
<27,60> <28,61> <112,173>
Face verts 3 flags 0 mat 0
<27,60> <112,173> <124,209>
Face verts 3 flags 0 mat 0
<43,77> <27,60> <124,209>
Face verts 3 flags 0 mat 0
<43,77> <124,209> <111,170>
Face verts 3 flags 0 mat 0
<75,117> <76,118> <92,135>
Face verts 3 flags 0 mat 0
<75,117> <92,135> <91,134>
Face verts 3 flags 0 mat 0
<43,77> <111,170> <123,207>
Face verts 3 flags 0 mat 0
<43,77> <123,207> <121,200>
Face verts 3 flags 0 mat 0
<55,93> <43,77> <121,200>
Face verts 3 flags 0 mat 0
<55,93> <121,200> <108,161>
Face verts 3 flags 0 mat 0
<92,135> <76,118> <77,119>
Face verts 3 flags 0 mat 0
<92,135> <77,119> <93,136>
Face verts 3 flags 0 mat 0
<127,218> <109,164> <44,78>
Face verts 3 flags 0 mat 0
<122,204> <127,218> <44,78>
Face verts 3 flags 0 mat 0
<122,204> <44,78> <56,94>
Face verts 3 flags 0 mat 0
<122,204> <56,94> <107,158>
Face verts 3 flags 0 mat 0
<93,136> <77,119> <78,120>
Face verts 3 flags 0 mat 0
<93,136> <78,120> <94,137>
Face verts 3 flags 0 mat 0
<78,120> <79,121> <95,138>
Face verts 3 flags 0 mat 0
<78,120> <95,138> <94,137>
Face verts 3 flags 0 mat 0
<79,121> <80,122> <96,139>
Face verts 3 flags 0 mat 0
<79,121> <96,139> <95,138>
Face verts 3 flags 0 mat 0
<96,139> <80,122> <81,123>
Face verts 3 flags 0 mat 0
<96,139> <81,123> <97,140>
Face verts 3 flags 0 mat 0
<81,123> <82,124> <98,141>
Face verts 3 flags 0 mat 0
<81,123> <98,141> <97,140>
Face verts 3 flags 0 mat 0
<98,141> <82,124> <83,125>
Face verts 3 flags 0 mat 0
<98,141> <83,125> <99,142>
Face verts 3 flags 0 mat 0
<99,142> <83,125> <84,126>
Face verts 3 flags 0 mat 0
<99,142> <84,126> <100,143>
Face verts 3 flags 0 mat 0
<84,126> <85,127> <101,144>
Face verts 3 flags 0 mat 0
<84,126> <101,144> <100,143>
Face verts 3 flags 0 mat 0
<85,127> <86,128> <102,145>
Face verts 3 flags 0 mat 0
<85,127> <102,145> <101,144>
Face verts 3 flags 0 mat 0
<105,152> <68,108> <83,125>
Face verts 3 flags 0 mat 0
<105,152> <83,125> <82,124>
Face verts 3 flags 0 mat 0
<117,189> <105,152> <82,124>
Face verts 3 flags 0 mat 0
<117,189> <82,124> <103,146>
Face verts 3 flags 0 mat 0
<102,145> <86,128> <71,113>
Face verts 3 flags 0 mat 0
<102,145> <71,113> <87,129>
Face verts 3 flags 0 mat 0
<1,16> <87,130> <88,131>
Face verts 3 flags 0 mat 0
<1,17> <88,131> <89,132>
Face verts 3 flags 0 mat 0
<1,18> <89,132> <90,133>
Face verts 3 flags 0 mat 0
<91,134> <1,19> <90,133>
Face verts 3 flags 0 mat 0
<92,135> <1,20> <91,134>
Face verts 3 flags 0 mat 0
<93,136> <1,21> <92,135>
Face verts 3 flags 0 mat 0
<94,137> <1,22> <93,136>
Face verts 3 flags 0 mat 0
<95,138> <1,25> <94,137>
Face verts 3 flags 0 mat 0
<95,138> <96,139> <1,26>
Face verts 3 flags 0 mat 0
<96,139> <97,140> <1,27>
Face verts 3 flags 0 mat 0
<97,140> <98,141> <1,28>
Face verts 3 flags 0 mat 0
<98,141> <99,142> <1,29>
Face verts 3 flags 0 mat 0
<1,30> <99,142> <100,143>
Face verts 3 flags 0 mat 0
<1,32> <100,143> <101,144>
Face verts 3 flags 0 mat 0
<1,33> <101,144> <102,145>
Face verts 3 flags 0 mat 0
<1,34> <102,145> <87,129>
Face verts 3 flags 0 mat 1
<129,224> <132,257> <131,247>
Face verts 3 flags 0 mat 1
<129,225> <133,259> <132,257>
Face verts 3 flags 0 mat 1
<129,226> <134,260> <133,259>
Face verts 3 flags 0 mat 1
<129,227> <135,261> <134,260>
Face verts 3 flags 0 mat 1
<136,262> <135,261> <129,228>
Face verts 3 flags 0 mat 1
<137,263> <136,262> <129,229>
Face verts 3 flags 0 mat 1
<138,264> <137,263> <129,230>
Face verts 3 flags 0 mat 1
<139,265> <138,264> <129,231>
Face verts 3 flags 0 mat 1
<139,265> <129,232> <140,266>
Face verts 3 flags 0 mat 1
<140,266> <129,233> <141,267>
Face verts 3 flags 0 mat 1
<141,267> <129,234> <142,268>
Face verts 3 flags 0 mat 1
<142,268> <129,235> <143,269>
Face verts 3 flags 0 mat 1
<143,269> <129,236> <144,270>
Face verts 3 flags 0 mat 1
<129,237> <145,271> <144,270>
Face verts 3 flags 0 mat 1
<129,238> <146,272> <145,271>
Face verts 3 flags 0 mat 1
<129,239> <131,248> <146,272>
Face verts 3 flags 0 mat 1
<132,257> <148,275> <147,273>
Face verts 3 flags 0 mat 1
<132,257> <147,273> <131,247>
Face verts 3 flags 0 mat 1
<133,259> <149,276> <148,275>
Face verts 3 flags 0 mat 1
<133,259> <148,275> <132,257>
Face verts 3 flags 0 mat 1
<134,260> <150,277> <149,276>
Face verts 3 flags 0 mat 1
<134,260> <149,276> <133,259>
Face verts 3 flags 0 mat 1
<135,261> <151,278> <150,277>
Face verts 3 flags 0 mat 1
<135,261> <150,277> <134,260>
Face verts 3 flags 0 mat 1
<152,279> <151,278> <135,261>
Face verts 3 flags 0 mat 1
<152,279> <135,261> <136,262>
Face verts 3 flags 0 mat 1
<153,280> <152,279> <136,262>
Face verts 3 flags 0 mat 1
<153,280> <136,262> <137,263>
Face verts 3 flags 0 mat 1
<154,281> <153,280> <137,263>
Face verts 3 flags 0 mat 1
<154,281> <137,263> <138,264>
Face verts 3 flags 0 mat 1
<155,282> <154,281> <138,264>
Face verts 3 flags 0 mat 1
<155,282> <138,264> <139,265>
Face verts 3 flags 0 mat 1
<140,266> <156,283> <155,282>
Face verts 3 flags 0 mat 1
<140,266> <155,282> <139,265>
Face verts 3 flags 0 mat 1
<141,267> <157,284> <156,283>
Face verts 3 flags 0 mat 1
<141,267> <156,283> <140,266>
Face verts 3 flags 0 mat 1
<142,268> <158,285> <157,284>
Face verts 3 flags 0 mat 1
<142,268> <157,284> <141,267>
Face verts 3 flags 0 mat 1
<143,269> <159,286> <158,285>
Face verts 3 flags 0 mat 1
<143,269> <158,285> <142,268>
Face verts 3 flags 0 mat 1
<160,287> <159,286> <143,269>
Face verts 3 flags 0 mat 1
<160,287> <143,269> <144,270>
Face verts 3 flags 0 mat 1
<161,288> <160,287> <144,270>
Face verts 3 flags 0 mat 1
<161,288> <144,270> <145,271>
Face verts 3 flags 0 mat 1
<162,289> <161,288> <145,271>
Face verts 3 flags 0 mat 1
<162,289> <145,271> <146,272>
Face verts 3 flags 0 mat 1
<147,274> <162,289> <146,272>
Face verts 3 flags 0 mat 1
<147,274> <146,272> <131,248>
Face verts 3 flags 0 mat 1
<109,165> <127,220> <163,290>
Face verts 3 flags 0 mat 1
<109,165> <163,290> <147,273>
Face verts 3 flags 0 mat 1
<109,165> <147,273> <148,275>
Face verts 3 flags 0 mat 1
<109,165> <148,275> <128,223>
Face verts 3 flags 0 mat 1
<165,293> <164,292> <152,279>
Face verts 3 flags 0 mat 1
<165,293> <152,279> <153,280>
Face verts 3 flags 0 mat 1
<166,294> <165,293> <153,280>
Face verts 3 flags 0 mat 1
<166,294> <153,280> <154,281>
Face verts 3 flags 0 mat 1
<167,295> <166,294> <154,281>
Face verts 3 flags 0 mat 1
<167,295> <154,281> <155,282>
Face verts 3 flags 0 mat 1
<156,283> <168,296> <167,295>
Face verts 3 flags 0 mat 1
<156,283> <167,295> <155,282>
Face verts 3 flags 0 mat 1
<157,284> <169,297> <168,296>
Face verts 3 flags 0 mat 1
<157,284> <168,296> <156,283>
Face verts 3 flags 0 mat 1
<158,285> <170,298> <169,297>
Face verts 3 flags 0 mat 1
<158,285> <169,297> <157,284>
Face verts 3 flags 0 mat 1
<159,286> <171,299> <170,298>
Face verts 3 flags 0 mat 1
<159,286> <170,298> <158,285>
Face verts 3 flags 0 mat 1
<172,300> <171,299> <159,286>
Face verts 3 flags 0 mat 1
<172,300> <159,286> <160,287>
Face verts 3 flags 0 mat 1
<173,301> <172,300> <160,287>
Face verts 3 flags 0 mat 1
<173,301> <160,287> <161,288>
Face verts 3 flags 0 mat 1
<174,302> <173,301> <161,288>
Face verts 3 flags 0 mat 1
<174,302> <161,288> <162,289>
Face verts 3 flags 0 mat 1
<163,291> <174,302> <162,289>
Face verts 3 flags 0 mat 1
<163,291> <162,289> <147,274>
Face verts 3 flags 0 mat 1
<177,306> <176,305> <164,292>
Face verts 3 flags 0 mat 1
<177,306> <164,292> <165,293>
Face verts 3 flags 0 mat 1
<178,307> <177,306> <165,293>
Face verts 3 flags 0 mat 1
<178,307> <165,293> <166,294>
Face verts 3 flags 0 mat 1
<179,308> <178,307> <166,294>
Face verts 3 flags 0 mat 1
<179,308> <166,294> <167,295>
Face verts 3 flags 0 mat 1
<168,296> <180,309> <179,308>
Face verts 3 flags 0 mat 1
<168,296> <179,308> <167,295>
Face verts 3 flags 0 mat 1
<169,297> <181,310> <180,309>
Face verts 3 flags 0 mat 1
<169,297> <180,309> <168,296>
Face verts 3 flags 0 mat 1
<170,298> <182,311> <181,310>
Face verts 3 flags 0 mat 1
<170,298> <181,310> <169,297>
Face verts 3 flags 0 mat 1
<171,299> <183,312> <182,311>
Face verts 3 flags 0 mat 1
<171,299> <182,311> <170,298>
Face verts 3 flags 0 mat 1
<184,313> <183,312> <171,299>
Face verts 3 flags 0 mat 1
<184,313> <171,299> <172,300>
Face verts 3 flags 0 mat 1
<185,314> <184,313> <172,300>
Face verts 3 flags 0 mat 1
<185,314> <172,300> <173,301>
Face verts 3 flags 0 mat 1
<186,315> <185,314> <173,301>
Face verts 3 flags 0 mat 1
<186,315> <173,301> <174,302>
Face verts 3 flags 0 mat 1
<175,304> <186,315> <174,302>
Face verts 3 flags 0 mat 1
<175,304> <174,302> <163,291>
Face verts 3 flags 0 mat 1
<188,318> <119,196> <108,162>
Face verts 3 flags 0 mat 1
<108,162> <121,202> <176,305>
Face verts 3 flags 0 mat 1
<108,162> <176,305> <188,318>
Face verts 3 flags 0 mat 1
<188,318> <176,305> <177,306>
Face verts 3 flags 0 mat 1
<188,318> <177,306> <189,319>
Face verts 3 flags 0 mat 1
<189,319> <177,306> <178,307>
Face verts 3 flags 0 mat 1
<189,319> <178,307> <190,320>
Face verts 3 flags 0 mat 1
<190,320> <178,307> <179,308>
Face verts 3 flags 0 mat 1
<190,320> <179,308> <191,321>
Face verts 3 flags 0 mat 1
<179,308> <180,309> <192,322>
Face verts 3 flags 0 mat 1
<179,308> <192,322> <191,321>
Face verts 3 flags 0 mat 1
<180,309> <181,310> <193,323>
Face verts 3 flags 0 mat 1
<180,309> <193,323> <192,322>
Face verts 3 flags 0 mat 1
<181,310> <182,311> <194,324>
Face verts 3 flags 0 mat 1
<181,310> <194,324> <193,323>
Face verts 3 flags 0 mat 1
<182,311> <183,312> <195,325>
Face verts 3 flags 0 mat 1
<182,311> <195,325> <194,324>
Face verts 3 flags 0 mat 1
<195,325> <183,312> <184,313>
Face verts 3 flags 0 mat 1
<195,325> <184,313> <196,326>
Face verts 3 flags 0 mat 1
<196,326> <184,313> <185,314>
Face verts 3 flags 0 mat 1
<196,326> <185,314> <197,327>
Face verts 3 flags 0 mat 1
<197,327> <185,314> <186,315>
Face verts 3 flags 0 mat 1
<197,327> <186,315> <198,328>
Face verts 3 flags 0 mat 1
<198,328> <186,315> <175,304>
Face verts 3 flags 0 mat 1
<198,328> <175,304> <187,317>
Face verts 3 flags 0 mat 1
<199,329> <187,316> <120,199>
Face verts 3 flags 0 mat 1
<199,329> <120,199> <118,191>
Face verts 3 flags 0 mat 1
<199,329> <118,191> <200,331>
Face verts 3 flags 0 mat 1
<119,196> <188,318> <202,333>
Face verts 3 flags 0 mat 1
<116,187> <119,196> <202,333>
Face verts 3 flags 0 mat 1
<116,187> <202,333> <201,332>
Face verts 3 flags 0 mat 1
<202,333> <188,318> <189,319>
Face verts 3 flags 0 mat 1
<202,333> <189,319> <203,334>
Face verts 3 flags 0 mat 1
<203,334> <189,319> <190,320>
Face verts 3 flags 0 mat 1
<203,334> <190,320> <204,335>
Face verts 3 flags 0 mat 1
<204,335> <190,320> <191,321>
Face verts 3 flags 0 mat 1
<204,335> <191,321> <205,336>
Face verts 3 flags 0 mat 1
<191,321> <192,322> <206,337>
Face verts 3 flags 0 mat 1
<191,321> <206,337> <205,336>
Face verts 3 flags 0 mat 1
<192,322> <193,323> <207,338>
Face verts 3 flags 0 mat 1
<192,322> <207,338> <206,337>
Face verts 3 flags 0 mat 1
<193,323> <194,324> <208,339>
Face verts 3 flags 0 mat 1
<193,323> <208,339> <207,338>
Face verts 3 flags 0 mat 1
<194,324> <195,325> <209,340>
Face verts 3 flags 0 mat 1
<194,324> <209,340> <208,339>
Face verts 3 flags 0 mat 1
<209,340> <195,325> <196,326>
Face verts 3 flags 0 mat 1
<209,340> <196,326> <210,341>
Face verts 3 flags 0 mat 1
<210,341> <196,326> <197,327>
Face verts 3 flags 0 mat 1
<210,341> <197,327> <211,342>
Face verts 3 flags 0 mat 1
<211,342> <197,327> <198,328>
Face verts 3 flags 0 mat 1
<211,342> <198,328> <212,343>
Face verts 3 flags 0 mat 1
<163,290> <127,220> <122,203>
Face verts 3 flags 0 mat 1
<163,290> <122,203> <175,303>
Face verts 3 flags 0 mat 1
<212,343> <198,328> <187,317>
Face verts 3 flags 0 mat 1
<212,343> <187,317> <199,330>
Face verts 3 flags 0 mat 1
<110,168> <128,223> <148,275>
Face verts 3 flags 0 mat 1
<110,168> <148,275> <149,276>
Face verts 3 flags 0 mat 1
<110,168> <149,276> <126,215>
Face verts 3 flags 0 mat 1
<199,329> <200,331> <214,346>
Face verts 3 flags 0 mat 1
<199,329> <214,346> <213,345>
Face verts 3 flags 0 mat 1
<126,215> <149,276> <150,277>
Face verts 3 flags 0 mat 1
<126,215> <150,277> <125,214>
Face verts 3 flags 0 mat 1
<114,181> <113,178> <216,348>
Face verts 3 flags 0 mat 1
<114,181> <216,348> <215,347>
Face verts 3 flags 0 mat 1
<151,278> <124,211> <112,174>
Face verts 3 flags 0 mat 1
<150,277> <151,278> <112,174>
Face verts 3 flags 0 mat 1
<150,277> <112,174> <125,214>
Face verts 3 flags 0 mat 1
<121,202> <123,206> <164,292>
Face verts 3 flags 0 mat 1
<121,202> <164,292> <176,305>
Face verts 3 flags 0 mat 1
<217,349> <201,332> <202,333>
Face verts 3 flags 0 mat 1
<217,349> <202,333> <218,350>
Face verts 3 flags 0 mat 1
<218,350> <202,333> <203,334>
Face verts 3 flags 0 mat 1
<218,350> <203,334> <219,351>
Face verts 3 flags 0 mat 1
<219,351> <203,334> <204,335>
Face verts 3 flags 0 mat 1
<219,351> <204,335> <220,352>
Face verts 3 flags 0 mat 1
<220,352> <204,335> <205,336>
Face verts 3 flags 0 mat 1
<220,352> <205,336> <221,353>
Face verts 3 flags 0 mat 1
<205,336> <206,337> <222,354>
Face verts 3 flags 0 mat 1
<205,336> <222,354> <221,353>
Face verts 3 flags 0 mat 1
<206,337> <207,338> <223,355>
Face verts 3 flags 0 mat 1
<206,337> <223,355> <222,354>
Face verts 3 flags 0 mat 0
<242,530> <232,363> <69,109>
Face verts 3 flags 0 mat 0
<242,530> <69,109> <233,362>
Face verts 3 flags 0 mat 1
<164,292> <123,206> <111,171>
Face verts 3 flags 0 mat 1
<152,279> <164,292> <111,171>
Face verts 3 flags 0 mat 1
<151,278> <152,279> <111,171>
Face verts 3 flags 0 mat 1
<151,278> <111,171> <124,211>
Face verts 3 flags 0 mat 0
<56,94> <235,361> <245,526>
Face verts 3 flags 0 mat 0
<68,108> <56,94> <245,526>
Face verts 3 flags 0 mat 0
<69,109> <68,108> <245,526>
Face verts 3 flags 0 mat 0
<69,109> <245,526> <233,362>
Face verts 3 flags 0 mat 1
<207,338> <208,339> <224,356>
Face verts 3 flags 0 mat 1
<207,338> <224,356> <223,355>
Face verts 3 flags 0 mat 0
<70,111> <231,110> <244,558>
Face verts 3 flags 0 mat 0
<246,562> <234,95> <57,96>
Face verts 3 flags 0 mat 0
<246,562> <57,96> <70,111>
Face verts 3 flags 0 mat 0
<246,562> <70,111> <244,558>
Face verts 3 flags 0 mat 1
<107,159> <120,199> <187,316>
Face verts 3 flags 0 mat 1
<175,303> <122,203> <107,159>
Face verts 3 flags 0 mat 1
<175,303> <107,159> <187,316>
Face verts 3 flags 0 mat 0
<250,534> <229,79> <31,64>
Face verts 3 flags 0 mat 0
<250,534> <31,64> <32,65>
Face verts 3 flags 0 mat 0
<251,538> <250,534> <32,65>
Face verts 3 flags 0 mat 0
<251,538> <32,65> <237,80>
Face verts 3 flags 0 mat 1
<208,339> <209,340> <225,357>
Face verts 3 flags 0 mat 1
<208,339> <225,357> <224,356>
Face verts 3 flags 0 mat 0
<84,126> <69,109> <232,363>
Face verts 3 flags 0 mat 0
<84,126> <232,363> <241,536>
Face verts 3 flags 0 mat 0
<84,126> <241,536> <239,540>
Face verts 3 flags 0 mat 0
<85,127> <84,126> <239,540>
Face verts 3 flags 0 mat 0
<85,127> <239,540> <240,542>
Face verts 3 flags 0 mat 0
<85,127> <240,542> <230,364>
Face verts 3 flags 0 mat 1
<106,156> <116,187> <201,332>
Face verts 3 flags 0 mat 1
<106,156> <201,332> <115,184>
Face verts 3 flags 0 mat 0
<44,78> <238,360> <249,522>
Face verts 3 flags 0 mat 0
<44,78> <249,522> <247,518>
Face verts 3 flags 0 mat 0
<56,94> <44,78> <247,518>
Face verts 3 flags 0 mat 0
<56,94> <247,518> <235,361>
Face verts 3 flags 0 mat 1
<225,357> <209,340> <210,341>
Face verts 3 flags 0 mat 1
<225,357> <210,341> <226,358>
Face verts 3 flags 0 mat 0
<252,552> <236,81> <45,82>
Face verts 3 flags 0 mat 0
<57,96> <234,95> <248,560>
Face verts 3 flags 0 mat 0
<45,82> <57,96> <248,560>
Face verts 3 flags 0 mat 0
<45,82> <248,560> <253,556>
Face verts 3 flags 0 mat 0
<45,82> <253,556> <252,552>
Face verts 3 flags 0 mat 1
<200,331> <118,191> <105,153>
Face verts 3 flags 0 mat 1
<200,331> <105,153> <117,188>
Face verts 3 flags 0 mat 1
<226,358> <210,341> <211,342>
Face verts 3 flags 0 mat 1
<226,358> <211,342> <227,359>
Face verts 3 flags 0 mat 1
<217,349> <216,348> <113,178>
Face verts 3 flags 0 mat 1
<217,349> <113,178> <104,150>
Face verts 3 flags 0 mat 1
<201,332> <217,349> <104,150>
Face verts 3 flags 0 mat 1
<201,332> <104,150> <115,184>
Face verts 3 flags 0 mat 1
<227,359> <211,342> <212,343>
Face verts 3 flags 0 mat 1
<227,359> <212,343> <228,35>
Face verts 3 flags 0 mat 1
<114,181> <215,347> <214,346>
Face verts 3 flags 0 mat 1
<103,147> <114,181> <214,346>
Face verts 3 flags 0 mat 1
<103,147> <214,346> <200,331>
Face verts 3 flags 0 mat 1
<103,147> <200,331> <117,188>
Face verts 3 flags 0 mat 1
<228,35> <212,343> <199,330>
Face verts 3 flags 0 mat 1
<228,35> <199,330> <213,344>
Face verts 3 flags 0 mat 1
<130,240> <213,345> <214,346>
Face verts 3 flags 0 mat 1
<130,241> <214,346> <215,347>
Face verts 3 flags 0 mat 1
<130,242> <215,347> <216,348>
Face verts 3 flags 0 mat 1
<130,243> <216,348> <217,349>
Face verts 3 flags 0 mat 1
<218,350> <130,244> <217,349>
Face verts 3 flags 0 mat 1
<219,351> <130,245> <218,350>
Face verts 3 flags 0 mat 1
<220,352> <130,246> <219,351>
Face verts 3 flags 0 mat 1
<221,353> <130,249> <220,352>
Face verts 3 flags 0 mat 1
<221,353> <222,354> <130,250>
Face verts 3 flags 0 mat 1
<222,354> <223,355> <130,251>
Face verts 3 flags 0 mat 1
<223,355> <224,356> <130,252>
Face verts 3 flags 0 mat 1
<224,356> <225,357> <130,253>
Face verts 3 flags 0 mat 1
<225,357> <226,358> <130,254>
Face verts 3 flags 0 mat 1
<130,255> <226,358> <227,359>
Face verts 3 flags 0 mat 1
<130,256> <227,359> <228,35>
Face verts 3 flags 0 mat 1
<130,258> <228,35> <213,344>
Face verts 3 flags 0 mat 1
<254,365> <257,392> <256,384>
Face verts 3 flags 0 mat 1
<254,366> <258,400> <257,392>
Face verts 3 flags 0 mat 1
<254,367> <259,402> <258,400>
Face verts 3 flags 0 mat 1
<254,368> <260,403> <259,402>
Face verts 3 flags 0 mat 1
<261,404> <260,403> <254,369>
Face verts 3 flags 0 mat 1
<262,405> <261,404> <254,370>
Face verts 3 flags 0 mat 1
<263,406> <262,405> <254,371>
Face verts 3 flags 0 mat 1
<264,407> <263,406> <254,372>
Face verts 3 flags 0 mat 1
<264,407> <254,373> <265,408>
Face verts 3 flags 0 mat 1
<265,408> <254,374> <266,409>
Face verts 3 flags 0 mat 1
<266,409> <254,375> <267,410>
Face verts 3 flags 0 mat 1
<267,410> <254,376> <268,411>
Face verts 3 flags 0 mat 1
<268,411> <254,377> <269,412>
Face verts 3 flags 0 mat 1
<254,378> <270,413> <269,412>
Face verts 3 flags 0 mat 1
<254,379> <271,414> <270,413>
Face verts 3 flags 0 mat 1
<254,380> <256,385> <271,414>
Face verts 3 flags 0 mat 1
<257,392> <273,417> <272,415>
Face verts 3 flags 0 mat 1
<257,392> <272,415> <256,384>
Face verts 3 flags 0 mat 1
<258,400> <274,418> <273,417>
Face verts 3 flags 0 mat 1
<258,400> <273,417> <257,392>
Face verts 3 flags 0 mat 1
<259,402> <275,419> <274,418>
Face verts 3 flags 0 mat 1
<259,402> <274,418> <258,400>
Face verts 3 flags 0 mat 1
<260,403> <276,420> <275,419>
Face verts 3 flags 0 mat 1
<260,403> <275,419> <259,402>
Face verts 3 flags 0 mat 1
<277,421> <276,420> <260,403>
Face verts 3 flags 0 mat 1
<277,421> <260,403> <261,404>
Face verts 3 flags 0 mat 1
<278,422> <277,421> <261,404>
Face verts 3 flags 0 mat 1
<278,422> <261,404> <262,405>
Face verts 3 flags 0 mat 1
<279,423> <278,422> <262,405>
Face verts 3 flags 0 mat 1
<279,423> <262,405> <263,406>
Face verts 3 flags 0 mat 1
<280,424> <279,423> <263,406>
Face verts 3 flags 0 mat 1
<280,424> <263,406> <264,407>
Face verts 3 flags 0 mat 1
<265,408> <281,425> <280,424>
Face verts 3 flags 0 mat 1
<265,408> <280,424> <264,407>
Face verts 3 flags 0 mat 1
<266,409> <282,426> <281,425>
Face verts 3 flags 0 mat 1
<266,409> <281,425> <265,408>
Face verts 3 flags 0 mat 1
<267,410> <283,427> <282,426>
Face verts 3 flags 0 mat 1
<267,410> <282,426> <266,409>
Face verts 3 flags 0 mat 1
<268,411> <284,428> <283,427>
Face verts 3 flags 0 mat 1
<268,411> <283,427> <267,410>
Face verts 3 flags 0 mat 1
<285,429> <284,428> <268,411>
Face verts 3 flags 0 mat 1
<285,429> <268,411> <269,412>
Face verts 3 flags 0 mat 1
<286,430> <285,429> <269,412>
Face verts 3 flags 0 mat 1
<286,430> <269,412> <270,413>
Face verts 3 flags 0 mat 1
<287,431> <286,430> <270,413>
Face verts 3 flags 0 mat 1
<287,431> <270,413> <271,414>
Face verts 3 flags 0 mat 1
<272,416> <287,431> <271,414>
Face verts 3 flags 0 mat 1
<272,416> <271,414> <256,385>
Face verts 3 flags 0 mat 1
<273,417> <289,434> <288,432>
Face verts 3 flags 0 mat 1
<273,417> <288,432> <272,415>
Face verts 3 flags 0 mat 1
<274,418> <290,435> <289,434>
Face verts 3 flags 0 mat 1
<274,418> <289,434> <273,417>
Face verts 3 flags 0 mat 1
<275,419> <291,436> <290,435>
Face verts 3 flags 0 mat 1
<275,419> <290,435> <274,418>
Face verts 3 flags 0 mat 1
<279,423> <229,440> <250,439>
Face verts 3 flags 0 mat 1
<279,423> <250,439> <278,422>
Face verts 3 flags 0 mat 1
<281,425> <293,443> <292,442>
Face verts 3 flags 0 mat 1
<281,425> <292,442> <280,424>
Face verts 3 flags 0 mat 1
<282,426> <294,444> <293,443>
Face verts 3 flags 0 mat 1
<282,426> <293,443> <281,425>
Face verts 3 flags 0 mat 1
<283,427> <295,445> <294,444>
Face verts 3 flags 0 mat 1
<283,427> <294,444> <282,426>
Face verts 3 flags 0 mat 1
<284,428> <296,446> <295,445>
Face verts 3 flags 0 mat 1
<284,428> <295,445> <283,427>
Face verts 3 flags 0 mat 1
<297,447> <296,446> <284,428>
Face verts 3 flags 0 mat 1
<297,447> <284,428> <285,429>
Face verts 3 flags 0 mat 1
<298,448> <297,447> <285,429>
Face verts 3 flags 0 mat 1
<298,448> <285,429> <286,430>
Face verts 3 flags 0 mat 1
<299,449> <298,448> <286,430>
Face verts 3 flags 0 mat 1
<299,449> <286,430> <287,431>
Face verts 3 flags 0 mat 1
<288,433> <299,449> <287,431>
Face verts 3 flags 0 mat 1
<288,433> <287,431> <272,416>
Face verts 3 flags 0 mat 1
<289,434> <301,452> <300,450>
Face verts 3 flags 0 mat 1
<289,434> <300,450> <288,432>
Face verts 3 flags 0 mat 1
<290,435> <302,453> <301,452>
Face verts 3 flags 0 mat 1
<290,435> <301,452> <289,434>
Face verts 3 flags 0 mat 1
<291,436> <303,454> <302,453>
Face verts 3 flags 0 mat 1
<291,436> <302,453> <290,435>
Face verts 3 flags 0 mat 1
<293,443> <305,457> <304,456>
Face verts 3 flags 0 mat 1
<293,443> <304,456> <292,442>
Face verts 3 flags 0 mat 1
<294,444> <306,458> <305,457>
Face verts 3 flags 0 mat 1
<294,444> <305,457> <293,443>
Face verts 3 flags 0 mat 1
<295,445> <307,459> <306,458>
Face verts 3 flags 0 mat 1
<295,445> <306,458> <294,444>
Face verts 3 flags 0 mat 1
<296,446> <308,460> <307,459>
Face verts 3 flags 0 mat 1
<296,446> <307,459> <295,445>
Face verts 3 flags 0 mat 1
<309,461> <308,460> <296,446>
Face verts 3 flags 0 mat 1
<309,461> <296,446> <297,447>
Face verts 3 flags 0 mat 1
<310,462> <309,461> <297,447>
Face verts 3 flags 0 mat 1
<310,462> <297,447> <298,448>
Face verts 3 flags 0 mat 1
<311,463> <310,462> <298,448>
Face verts 3 flags 0 mat 1
<311,463> <298,448> <299,449>
Face verts 3 flags 0 mat 1
<300,451> <311,463> <299,449>
Face verts 3 flags 0 mat 1
<300,451> <299,449> <288,433>
Face verts 3 flags 0 mat 1
<300,450> <301,452> <313,466>
Face verts 3 flags 0 mat 1
<300,450> <313,466> <312,464>
Face verts 3 flags 0 mat 1
<301,452> <302,453> <314,467>
Face verts 3 flags 0 mat 1
<301,452> <314,467> <313,466>
Face verts 3 flags 0 mat 1
<302,453> <303,454> <315,468>
Face verts 3 flags 0 mat 1
<302,453> <315,468> <314,467>
Face verts 3 flags 0 mat 1
<234,564> <246,512> <315,468>
Face verts 3 flags 0 mat 1
<234,564> <315,468> <303,454>
Face verts 3 flags 0 mat 1
<234,564> <303,454> <248,511>
Face verts 3 flags 0 mat 1
<304,456> <305,457> <317,471>
Face verts 3 flags 0 mat 1
<304,456> <317,471> <316,470>
Face verts 3 flags 0 mat 1
<305,457> <306,458> <318,472>
Face verts 3 flags 0 mat 1
<305,457> <318,472> <317,471>
Face verts 3 flags 0 mat 1
<306,458> <307,459> <319,473>
Face verts 3 flags 0 mat 1
<306,458> <319,473> <318,472>
Face verts 3 flags 0 mat 1
<307,459> <308,460> <320,474>
Face verts 3 flags 0 mat 1
<307,459> <320,474> <319,473>
Face verts 3 flags 0 mat 1
<320,474> <308,460> <309,461>
Face verts 3 flags 0 mat 1
<320,474> <309,461> <321,475>
Face verts 3 flags 0 mat 1
<321,475> <309,461> <310,462>
Face verts 3 flags 0 mat 1
<321,475> <310,462> <322,476>
Face verts 3 flags 0 mat 1
<322,476> <310,462> <311,463>
Face verts 3 flags 0 mat 1
<322,476> <311,463> <323,477>
Face verts 3 flags 0 mat 1
<323,477> <311,463> <300,451>
Face verts 3 flags 0 mat 1
<323,477> <300,451> <312,465>
Face verts 3 flags 0 mat 1
<312,464> <313,466> <325,480>
Face verts 3 flags 0 mat 1
<312,464> <325,480> <324,478>
Face verts 3 flags 0 mat 1
<313,466> <314,467> <326,481>
Face verts 3 flags 0 mat 1
<313,466> <326,481> <325,480>
Face verts 3 flags 0 mat 1
<314,467> <315,468> <327,482>
Face verts 3 flags 0 mat 1
<314,467> <327,482> <326,481>
Face verts 3 flags 0 mat 1
<244,513> <328,483> <327,482>
Face verts 3 flags 0 mat 1
<244,513> <327,482> <315,468>
Face verts 3 flags 0 mat 1
<244,513> <315,468> <246,512>
Face verts 3 flags 0 mat 1
<277,421> <251,438> <237,550>
Face verts 3 flags 0 mat 1
<236,554> <252,437> <276,420>
Face verts 3 flags 0 mat 1
<237,550> <236,554> <276,420>
Face verts 3 flags 0 mat 1
<237,550> <276,420> <277,421>
Face verts 3 flags 0 mat 1
<316,470> <317,471> <331,487>
Face verts 3 flags 0 mat 1
<316,470> <331,487> <330,486>
Face verts 3 flags 0 mat 1
<317,471> <318,472> <332,488>
Face verts 3 flags 0 mat 1
<317,471> <332,488> <331,487>
Face verts 3 flags 0 mat 1
<318,472> <319,473> <333,489>
Face verts 3 flags 0 mat 1
<318,472> <333,489> <332,488>
Face verts 3 flags 0 mat 1
<319,473> <320,474> <334,490>
Face verts 3 flags 0 mat 1
<319,473> <334,490> <333,489>
Face verts 3 flags 0 mat 1
<334,490> <320,474> <321,475>
Face verts 3 flags 0 mat 1
<334,490> <321,475> <335,491>
Face verts 3 flags 0 mat 1
<335,491> <321,475> <322,476>
Face verts 3 flags 0 mat 1
<335,491> <322,476> <336,492>
Face verts 3 flags 0 mat 1
<336,492> <322,476> <323,477>
Face verts 3 flags 0 mat 1
<336,492> <323,477> <337,493>
Face verts 3 flags 0 mat 1
<291,436> <253,510> <248,511>
Face verts 3 flags 0 mat 1
<291,436> <248,511> <303,454>
Face verts 3 flags 0 mat 1
<337,493> <323,477> <312,465>
Face verts 3 flags 0 mat 1
<337,493> <312,465> <324,479>
Face verts 3 flags 0 mat 1
<324,478> <325,480> <339,496>
Face verts 3 flags 0 mat 1
<324,478> <339,496> <338,495>
Face verts 3 flags 0 mat 1
<325,480> <326,481> <340,497>
Face verts 3 flags 0 mat 1
<325,480> <340,497> <339,496>
Face verts 3 flags 0 mat 1
<277,421> <278,422> <250,439>
Face verts 3 flags 0 mat 1
<277,421> <250,439> <251,438>
Face verts 3 flags 0 mat 1
<326,481> <327,482> <341,498>
Face verts 3 flags 0 mat 1
<326,481> <341,498> <340,497>
Face verts 3 flags 0 mat 1
<327,482> <328,483> <342,499>
Face verts 3 flags 0 mat 1
<327,482> <342,499> <341,498>
Face verts 3 flags 0 mat 1
<292,442> <249,441> <238,524>
Face verts 3 flags 0 mat 1
<280,424> <292,442> <238,524>
Face verts 3 flags 0 mat 1
<279,423> <280,424> <238,524>
Face verts 3 flags 0 mat 1
<279,423> <238,524> <229,440>
Face verts 3 flags 0 mat 1
<247,455> <249,441> <292,442>
Face verts 3 flags 0 mat 1
<247,455> <292,442> <304,456>
Face verts 3 flags 0 mat 1
<343,500> <240,516> <239,517>
Face verts 3 flags 0 mat 1
<343,500> <239,517> <344,501>
Face verts 3 flags 0 mat 1
<241,484> <329,485> <345,502>
Face verts 3 flags 0 mat 1
<241,484> <345,502> <344,501>
Face verts 3 flags 0 mat 1
<241,484> <344,501> <239,517>
Face verts 3 flags 0 mat 1
<345,502> <329,485> <330,486>
Face verts 3 flags 0 mat 1
<345,502> <330,486> <346,503>
Face verts 3 flags 0 mat 1
<275,419> <276,420> <252,437>
Face verts 3 flags 0 mat 1
<291,436> <275,419> <252,437>
Face verts 3 flags 0 mat 1
<291,436> <252,437> <253,510>
Face verts 3 flags 0 mat 1
<330,486> <331,487> <347,504>
Face verts 3 flags 0 mat 1
<330,486> <347,504> <346,503>
Face verts 3 flags 0 mat 1
<331,487> <332,488> <348,505>
Face verts 3 flags 0 mat 1
<331,487> <348,505> <347,504>
Face verts 3 flags 0 mat 1
<316,470> <245,469> <235,520>
Face verts 3 flags 0 mat 1
<235,520> <247,455> <304,456>
Face verts 3 flags 0 mat 1
<235,520> <304,456> <316,470>
Face verts 3 flags 0 mat 1
<332,488> <333,489> <349,506>
Face verts 3 flags 0 mat 1
<332,488> <349,506> <348,505>
Face verts 3 flags 0 mat 1
<333,489> <334,490> <350,507>
Face verts 3 flags 0 mat 1
<333,489> <350,507> <349,506>
Face verts 3 flags 0 mat 1
<245,469> <316,470> <330,486>
Face verts 3 flags 0 mat 1
<233,528> <245,469> <330,486>
Face verts 3 flags 0 mat 1
<233,528> <330,486> <329,485>
Face verts 3 flags 0 mat 1
<233,528> <329,485> <242,515>
Face verts 3 flags 0 mat 1
<350,507> <334,490> <335,491>
Face verts 3 flags 0 mat 1
<350,507> <335,491> <351,508>
Face verts 3 flags 0 mat 1
<232,532> <242,515> <329,485>
Face verts 3 flags 0 mat 1
<232,532> <329,485> <241,484>
Face verts 3 flags 0 mat 1
<351,508> <335,491> <336,492>
Face verts 3 flags 0 mat 1
<351,508> <336,492> <352,509>
Face verts 3 flags 0 mat 1
<328,483> <244,513> <231,548>
Face verts 3 flags 0 mat 1
<328,483> <231,548> <243,514>
Face verts 3 flags 0 mat 1
<352,509> <336,492> <337,493>
Face verts 3 flags 0 mat 1
<352,509> <337,493> <353,381>
Face verts 3 flags 0 mat 1
<230,544> <240,516> <343,500>
Face verts 3 flags 0 mat 1
<230,544> <343,500> <342,499>
Face verts 3 flags 0 mat 1
<230,544> <342,499> <328,483>
Face verts 3 flags 0 mat 1
<230,544> <328,483> <243,514>
Face verts 3 flags 0 mat 1
<353,381> <337,493> <324,479>
Face verts 3 flags 0 mat 1
<353,381> <324,479> <338,494>
Face verts 3 flags 0 mat 1
<255,382> <338,495> <339,496>
Face verts 3 flags 0 mat 1
<255,383> <339,496> <340,497>
Face verts 3 flags 0 mat 1
<255,386> <340,497> <341,498>
Face verts 3 flags 0 mat 1
<255,387> <341,498> <342,499>
Face verts 3 flags 0 mat 1
<343,500> <255,388> <342,499>
Face verts 3 flags 0 mat 1
<344,501> <255,389> <343,500>
Face verts 3 flags 0 mat 1
<345,502> <255,390> <344,501>
Face verts 3 flags 0 mat 1
<346,503> <255,391> <345,502>
Face verts 3 flags 0 mat 1
<346,503> <347,504> <255,393>
Face verts 3 flags 0 mat 1
<347,504> <348,505> <255,394>
Face verts 3 flags 0 mat 1
<348,505> <349,506> <255,395>
Face verts 3 flags 0 mat 1
<349,506> <350,507> <255,396>
Face verts 3 flags 0 mat 1
<350,507> <351,508> <255,397>
Face verts 3 flags 0 mat 1
<255,398> <351,508> <352,509>
Face verts 3 flags 0 mat 1
<255,399> <352,509> <353,381>
Face verts 3 flags 0 mat 1
<255,401> <353,381> <338,494>
DrawFlags 0
Unit V0.01 Id 18927813 Parent 18927812 Size 00000009
Units 2
ObRQ V0.01 Id 18927817 Parent 18927812 Size 00000121
Object Radiosity Quality: 0
Object Radiosity Max Area: 0
Object Radiosity Min Area: 0
Object Radiosity Mesh Accuracy: 0
Mat1 V0.06 Id 18873956 Parent 18927812 Size 00000095
mat# 0
shader: phong facet: auto32
rgb 0,0.0352941,1
alpha 1 ka 0.1 ks 0.5 exp 0 ior 1.6
ShBx V0.03 Id 18873957 Parent 18873956 Size 00000427
Shader class: color
Shader name: "plain color" (plain)
Number of parameters: 1
colour: color (0, 9, 255)
Flags: 3
Shader class: transparency
Shader name: "none" (none)
Number of parameters: 0
Flags: 3
Shader class: reflectance
Shader name: "matte" (matte)
Number of parameters: 2
ambient factor: float 0.1
diffuse factor: float 1
Flags: 3
Shader class: displacement
Shader name: "none" (none)
Number of parameters: 0
Flags: 3
Mat1 V0.06 Id 18873124 Parent 18927812 Size 00000102
mat# 1
shader: phong facet: auto32
rgb 1,0.054902,0.0313726
alpha 1 ka 0.1 ks 0.5 exp 0 ior 1.6
ShBx V0.03 Id 18873125 Parent 18873124 Size 00000428
Shader class: color
Shader name: "plain color" (plain)
Number of parameters: 1
colour: color (255, 14, 8)
Flags: 3
Shader class: transparency
Shader name: "none" (none)
Number of parameters: 0
Flags: 3
Shader class: reflectance
Shader name: "matte" (matte)
Number of parameters: 2
ambient factor: float 0.1
diffuse factor: float 1
Flags: 3
Shader class: displacement
Shader name: "none" (none)
Number of parameters: 0
Flags: 3
END V1.00 Id 0 Parent 0 Size 0 | 30.217608 | 10,762 | 0.683566 |
80f61e2f88d002670303a34c0766ff46612b77c7 | 162 | cob | COBOL | code/test.cob | JoSSte/docker-gnucobol | 3165f4ac563d2686089cc126816160c5e68fc6e7 | [
"MIT"
] | null | null | null | code/test.cob | JoSSte/docker-gnucobol | 3165f4ac563d2686089cc126816160c5e68fc6e7 | [
"MIT"
] | null | null | null | code/test.cob | JoSSte/docker-gnucobol | 3165f4ac563d2686089cc126816160c5e68fc6e7 | [
"MIT"
] | null | null | null | identification division.
program-id. docker-gnucobol.
procedure division.
display 'docker-gnucobol installed successfully!'.
| 23.142857 | 57 | 0.641975 |
727da3ed71a2d51f9f3a5f121331a88ed200c3e0 | 6,513 | cob | COBOL | CRC32.cob | dinodev76/GC-Utilities | 52bcad43128b038e8aaaa49f13f9b5e31589b075 | [
"MIT"
] | null | null | null | CRC32.cob | dinodev76/GC-Utilities | 52bcad43128b038e8aaaa49f13f9b5e31589b075 | [
"MIT"
] | null | null | null | CRC32.cob | dinodev76/GC-Utilities | 52bcad43128b038e8aaaa49f13f9b5e31589b075 | [
"MIT"
] | null | null | null | *============================ CRC32 =============================*
* Authors: Brian D Pead
*
* Description: Subroutine to calculate a CRC-32 checksum on the
* specified input.
*
* License: MIT
*
* Date Version Description
* ---- ------- -----------
* 2020-02-08 1.0 First release
*================================================================*
IDENTIFICATION DIVISION.
*========================
PROGRAM-ID. CRC32.
ENVIRONMENT DIVISION.
*=====================
CONFIGURATION SECTION.
*----------------------
SOURCE-COMPUTER.
IBM-Z15.
* IBM-Z15 DEBUGGING MODE.
INPUT-OUTPUT SECTION.
*---------------------
FILE-CONTROL.
/
DATA DIVISION.
*==============
FILE SECTION.
*-------------
WORKING-STORAGE SECTION.
*------------------------
01 W-CHECKSUM-SHIFT PIC 9(09) COMP.
01 W-BITWISE-RESULT PIC 9(09) COMP.
01 W-BITWISE-PROG PIC X(08) VALUE 'BITWISE'.
01 FILLER PIC X(01) VALUE 'Y'.
88 W-FIRST-CALL VALUE 'Y'.
88 W-NOT-FIRST-CALL VALUE 'N'.
01 W-COMPILED-DATE.
05 W-COMPILED-DATE-YYYY
PIC X(04).
05 W-COMPILED-DATE-MM PIC X(02).
05 W-COMPILED-DATE-DD PIC X(02).
05 W-COMPILED-TIME-HH PIC X(02).
05 W-COMPILED-TIME-MM PIC X(02).
05 W-COMPILED-TIME-SS PIC X(02).
05 FILLER PIC X(07).
01 W-HIGH-VALUES-X PIC X(04) VALUE HIGH-VALUES.
01 W-HIGH-VALUES-BIN REDEFINES W-HIGH-VALUES-X
PIC 9(09) COMP.
01 W-INPUT-1 PIC 9(09) COMP.
01 W-INPUT-1-BYTES REDEFINES W-INPUT-1.
05 W-INPUT-1-1-3 PIC X(03).
05 W-INPUT-1-4 PIC X(01).
01 W-INPUT-2 PIC 9(09) COMP.
01 W-INPUT-2-BYTES REDEFINES W-INPUT-2.
05 W-INPUT-2-1-3 PIC X(03).
05 W-INPUT-2-4 PIC X(01).
01 W-SUB-1 PIC S9(04) COMP.
01 FILLER REDEFINES W-SUB-1.
05 FILLER PIC X(01) VALUE X'00'.
05 W-SUB-1-2 PIC X(01).
01 W-SUB-2 PIC S9(04) COMP.
01 FILLER REDEFINES W-SUB-2.
05 FILLER PIC X(01) VALUE X'00'.
05 W-SUB-2-2 PIC X(01).
01 W-BITWISE-PARAMETER. COPY BITWISEL.
COPY CRC32W.
/
LINKAGE SECTION.
*----------------
01 L-PARAMETER. COPY CRC32L.
01 L-BUFFER.
05 L-BUFFER-BYTE PIC X(01) OCCURS 32768
INDEXED L-DX.
/
PROCEDURE DIVISION USING L-PARAMETER.
*==================
MAIN.
*-----
PERFORM SUB-1000-START-UP THRU SUB-1000-EXIT
PERFORM SUB-2000-PROCESS THRU SUB-2000-EXIT
VARYING L-DX FROM 1 BY 1
UNTIL L-DX > CRC-BUFFER-LEN
IF CRC-STAGE-START-END
OR CRC-STAGE-END
PERFORM SUB-3000-COMPLEMENT THRU SUB-3000-EXIT
END-IF
.
MAIN-EXIT.
GOBACK.
/
SUB-1000-START-UP.
*------------------
IF CRC-STAGE-START-END
OR CRC-STAGE-START
MOVE W-HIGH-VALUES-BIN
TO CRC-CHECKSUM
END-IF
SET ADDRESS OF L-BUFFER
TO CRC-BUFFER-PTR
SET BW-OPERATION-XOR TO TRUE
MOVE 4 TO BW-INPUT-LEN
SET BW-OUTPUT-PTR TO ADDRESS OF W-BITWISE-RESULT
IF W-NOT-FIRST-CALL
GO TO SUB-1000-EXIT
END-IF
SET W-NOT-FIRST-CALL TO TRUE
MOVE FUNCTION WHEN-COMPILED
TO W-COMPILED-DATE
DISPLAY 'CRC32 compiled on '
W-COMPILED-DATE-YYYY '/'
W-COMPILED-DATE-MM '/'
W-COMPILED-DATE-DD ' at '
W-COMPILED-TIME-HH ':'
W-COMPILED-TIME-MM ':'
W-COMPILED-TIME-SS
.
SUB-1000-EXIT.
EXIT.
/
SUB-2000-PROCESS.
*-----------------
**** SHIFT CRC 8 BITS RIGHT:
COMPUTE W-CHECKSUM-SHIFT
= CRC-CHECKSUM / 256
**** USE LAST BYTE OF CRC:
MOVE CRC-CHECKSUM TO W-INPUT-1
MOVE LOW-VALUES TO W-INPUT-1-1-3
**** NEXT BYTE OF INPUT:
MOVE 0 TO W-INPUT-2
MOVE L-BUFFER-BYTE(L-DX)
TO W-INPUT-2-4
**** XOR LAST BYTE OF CRC AND NEXT BYTE OF INPUT:
SET BW-INPUT-1-PTR TO ADDRESS OF W-INPUT-1
SET BW-INPUT-2-PTR TO ADDRESS OF W-INPUT-2
PERFORM SUB-9100-CALL-BITWISE THRU SUB-9100-EXIT
**** XOR TABLE ENTRY AND CRC>>8:
SET BW-INPUT-1-PTR TO ADDRESS OF
W-CRC32-ENTRY(W-BITWISE-RESULT + 1)
SET BW-INPUT-2-PTR TO ADDRESS OF W-CHECKSUM-SHIFT
PERFORM SUB-9100-CALL-BITWISE THRU SUB-9100-EXIT
MOVE W-BITWISE-RESULT TO CRC-CHECKSUM
.
SUB-2000-EXIT.
EXIT.
/
SUB-3000-COMPLEMENT.
*--------------------
**** BITWISE COMPLEMENT (I.E. BITWISE NOT):
SET BW-INPUT-1-PTR TO ADDRESS OF CRC-CHECKSUM
SET BW-INPUT-2-PTR TO ADDRESS OF W-HIGH-VALUES-X
PERFORM SUB-9100-CALL-BITWISE THRU SUB-9100-EXIT
MOVE W-BITWISE-RESULT TO CRC-CHECKSUM
.
SUB-3000-EXIT.
EXIT.
/
SUB-9100-CALL-BITWISE.
*----------------------
CALL W-BITWISE-PROG USING W-BITWISE-PARAMETER
.
SUB-9100-EXIT.
EXIT.
| 31.463768 | 73 | 0.402119 |
85d23f6d1420e30013e23d39d87ba2f23d89e0b7 | 341 | cbl | COBOL | cobol/you_cant_code_under_pressure_#1_53ee5429ba190077850011d4.cbl | p85/codewars-solutions | b4a5073b0c21f64e50e975416526ba5dd58019fc | [
"MIT"
] | null | null | null | cobol/you_cant_code_under_pressure_#1_53ee5429ba190077850011d4.cbl | p85/codewars-solutions | b4a5073b0c21f64e50e975416526ba5dd58019fc | [
"MIT"
] | null | null | null | cobol/you_cant_code_under_pressure_#1_53ee5429ba190077850011d4.cbl | p85/codewars-solutions | b4a5073b0c21f64e50e975416526ba5dd58019fc | [
"MIT"
] | null | null | null | 123456*Indentation of at least 7 spaces is required for COBOL.
IDENTIFICATION DIVISION.
PROGRAM-ID. Pressure.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 N PIC S9(8).
01 Result PIC S9(8).
PROCEDURE DIVISION.
DoubleInteger.
COMPUTE Result = N + N.
END PROGRAM Pressure.
| 22.733333 | 62 | 0.612903 |
c225587d89774ada51cc10b944b10d4d5d4cd9c6 | 3,828 | cbl | COBOL | ARITMETICA.cbl | neomatrixcode/curso-COBOL | 99faf59f887e0f05364ed49920db48e5ad9def72 | [
"CNRI-Python"
] | null | null | null | ARITMETICA.cbl | neomatrixcode/curso-COBOL | 99faf59f887e0f05364ed49920db48e5ad9def72 | [
"CNRI-Python"
] | null | null | null | ARITMETICA.cbl | neomatrixcode/curso-COBOL | 99faf59f887e0f05364ed49920db48e5ad9def72 | [
"CNRI-Python"
] | null | null | null |
IDENTIFICATION DIVISION.
PROGRAM-ID. ARITMETICA.
DATA DIVISION.
WORKING-STORAGE SECTION.
77 NUMERO1 PIC 9 VALUE 1.
77 NUMERO2 PIC 9 value 2.
77 RESULTADO PIC 99 VALUE 1.
77 numerogrande PIC s9(10)v99 COMP-3 VALUE ZERO.
* El empaquetamiento computacional se usa frecuentemente para reducir el
* tamaño de un archivo.
* Existenten distintos tipos de empaquetamiento en COBOL
* COMP-1 : usado en la representacion de datos flotantes de precision
* simple, de 0 hasta 10**38
* COMP-2 : usado en la representacion de datos flotantes de precision
* doble, de 0 hasta 10**307
* COMP-3 : representa los numeros como BCD, binario codificado en decimal,
* permite representar digitos por arriba de 31 decimales. A los cajeros
* automaticos les gusta esta representacion. En un byte se almacenan dos
* numeros decimales
* Decimal: 0 1 2 3 4 5 6 7 8 9
* BCD: 0000 0001 0010 0011 0100 0101 0110 0111 1000 1001
* COMP-4 : solo puede representar enteros
* COMP-5 : similar al comp-4, pero puedes especificar la posicion del punto
* decimal, combian la eficiencia del cmp-4 con la exactitud del comp-3, no
* se pueden exceder los 18 digitos decimales
PROCEDURE DIVISION.
DISPLAY "NUMERO1 = "NUMERO1.
DISPLAY "NUMERO2 = "NUMERO2.
* SUMA
* RESULTADO = NUMERO1 + NUMERO2 + 5 + RESULTADO
ADD NUMERO1 NUMERO2 5 TO RESULTADO.
DISPLAY "ADD NUMERO1 NUMERO2 5 TO RESULTADO = "RESULTADO.
* RESULTADO = NUMERO1 + NUMERO2 + 5
ADD NUMERO1 NUMERO2 5 GIVING RESULTADO.
DISPLAY "ADD NUMERO1 NUMERO2 5 GIVING RESULTADO = "RESULTADO.
MOVE 1 TO RESULTADO
* RESTA
* RESULTADO = NUMERO1 - NUMERO2 - 5 - RESULTADO
SUBTRACT NUMERO1 NUMERO2 5 FROM RESULTADO.
DISPLAY "SUBTRACT NUMERO1 NUMERO2 5 FROM RESULTADO:"RESULTADO.
* RESULTADO = NUMERO1 - 5 - NUMERO2
SUBTRACT NUMERO1 5 FROM NUMERO2 GIVING RESULTADO.
* Esta instruccion ocupa 72 caracteres en una linea, por lo que ya no es posible colocar mas
DISPLAY "SUBTRACT NUMERO1 5 FROM NUMERO2 GIVING RESULTADO ="
* se emplea el caracter '-' en la columna 7 para indicar que se esta continuando la instruccion de
* la linea anterior
-RESULTADO.
MOVE 0 TO RESULTADO.
* MULTIPLICACION
* RESULTADO = 5 * RESULTADO
MULTIPLY 5 BY RESULTADO.
DISPLAY "MULTIPLY 5 BY RESULTADO = "RESULTADO.
* RESULTADO = 5 * NUMERO1
MULTIPLY 5 BY NUMERO1 GIVING RESULTADO.
DISPLAY "MULTIPLY 5 BY NUMERO1 GIVING RESULTADO = "RESULTADO.
MOVE 10 TO RESULTADO.
MOVE 8 TO NUMERO2.
* DIVISION
* RESULTADO = RESULTADO / 10
DIVIDE 10 INTO RESULTADO.
DISPLAY "DIVIDE 10 INTO RESULTADO = "RESULTADO.
* RESULTADO = NUMERO2 / 2
DIVIDE 2 INTO NUMERO2 GIVING RESULTADO.
DISPLAY "DIVIDE 2 INTO NUMERO2 GIVING RESULTADO = "RESULTADO.
* MIX
* COMPUTE evalua una expresion aritmetica
* PEMDAS
* parentesis exponentes multiplicacion division adicion substraccion
* cobol evalua las expresiones aritmeticas en ese orden
COMPUTE RESULTADO = (2 + 3) * 5.
DISPLAY "RESULTADO = (2 + 3) * 5 = "RESULTADO.
* el ** indica potencia
COMPUTE RESULTADO = 3 ** 3.
DISPLAY "RESULTADO = 3 ** 3 = "RESULTADO.
* en C el numero negativo mas pequeño que se puede almacenar en un
* int es (-2147483647-1)
move -9000000000.22 to numerogrande
display numerogrande.
STOP RUN.
| 42.533333 | 104 | 0.623824 |
0ba9b5767c45e40fbbe7b2d0c3112b07e3abfd00 | 6,294 | cbl | COBOL | middleware/binding/cobol/example/tx/EXAMPLE1.cbl | casualcore/casual | 047a4eaabbba52ad3ce63dc698a9325ad5fcec6d | [
"MIT"
] | null | null | null | middleware/binding/cobol/example/tx/EXAMPLE1.cbl | casualcore/casual | 047a4eaabbba52ad3ce63dc698a9325ad5fcec6d | [
"MIT"
] | null | null | null | middleware/binding/cobol/example/tx/EXAMPLE1.cbl | casualcore/casual | 047a4eaabbba52ad3ce63dc698a9325ad5fcec6d | [
"MIT"
] | 1 | 2022-02-21T18:30:25.000Z | 2022-02-21T18:30:25.000Z | * Copyright (c) 2009-2017, Christian Ferrari
* <[email protected]>
* All rights reserved.
*
* This file is part of LIXA.
*
* LIXA is free software: you can redistribute it and/or modify
* it under the terms of the GNU General Public License version 2i
* as published by the Free Software Foundation.
*
* LIXA is distributed in the hope that it will be useful,
* but WITHOUT ANY WARRANTY; without even the implied warranty of
* MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
* GNU General Public License for more details.
*
* You should have received a copy of the
* GNU General Public License along with LIXA.
* If not, see <http://www.gnu.org/licenses/>.
*
IDENTIFICATION DIVISION.
PROGRAM-ID. EXAMPLE1.
DATA DIVISION.
WORKING-STORAGE SECTION.
* Include TX definitions
01 TX-RETURN-STATUS.
COPY TXSTATUS.
01 TX-INFO-AREA.
COPY TXINFDEF.
* Include LIXA definitions
* COPY LIXAXID.
PROCEDURE DIVISION.
000-MAIN.
DISPLAY 'Executing EXAMPLE1'.
MOVE ZERO TO TX-RETURN-STATUS.
* Calling TXOPEN (tx_open)
CALL "TXOPEN" USING TX-RETURN-STATUS.
DISPLAY 'TXOPEN returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* Calling TXBEGIN (tx_begin)
CALL "TXBEGIN" USING TX-RETURN-STATUS.
DISPLAY 'TXBEGIN returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* Inspect transaction info
PERFORM INFO-PARA THRU INFO-PARA.
* Calling TXCOMMIT (tx_commit)
CALL "TXCOMMIT" USING TX-RETURN-STATUS.
DISPLAY 'TXCOMMIT returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
PERFORM INFO-PARA THRU INFO-PARA.
* Set non default parameters
* LIXA does not support this option
MOVE 1 TO COMMIT-RETURN.
CALL "TXSETCOMMITRET" USING TX-INFO-AREA TX-RETURN-STATUS.
DISPLAY 'TXSETCOMMITRET returned value ' TX-STATUS.
* IF NOT TX-NOT-SUPPORTED THEN
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* LIXA supports timeout
MOVE 5 TO TRANSACTION-TIMEOUT.
CALL "TXSETTIMEOUT" USING TX-INFO-AREA TX-RETURN-STATUS.
DISPLAY 'TXSETTIMEOUT returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* LIXA supports transaction control
MOVE 1 TO TRANSACTION-CONTROL.
CALL "TXSETTRANCTL" USING TX-INFO-AREA TX-RETURN-STATUS.
DISPLAY 'TXSETTRANCTL returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
PERFORM INFO-PARA THRU INFO-PARA.
* Transaction control must be resetted to avoid error during close
MOVE 0 TO TRANSACTION-CONTROL.
CALL "TXSETTRANCTL" USING TX-INFO-AREA TX-RETURN-STATUS.
DISPLAY 'TXSETTRANCTL returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* Calling TXBEGIN (tx_begin)
CALL "TXBEGIN" USING TX-RETURN-STATUS.
DISPLAY 'TXBEGIN returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* Calling TXROLLBACK (tx_rollback)
CALL "TXROLLBACK" USING TX-RETURN-STATUS.
DISPLAY 'TXROLLBACK returned value ' TX-STATUS.
IF NOT TX-OK
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* Calling TXCLOSE (tx_close)
CALL "TXCLOSE" USING TX-RETURN-STATUS.
DISPLAY 'TXCLOSE returned value ' TX-STATUS.
IF NOT TX-OK
STOP RUN RETURNING 1
DISPLAY 'Execution terminated!'.
STOP RUN.
* Calling TXINFORM (tx_info)
INFO-PARA.
CALL "TXINFORM" USING TX-INFO-AREA TX-RETURN-STATUS.
DISPLAY 'TXINFORM returned value ' TX-STATUS.
IF NOT TX-OK THEN
DISPLAY 'Exiting...'
STOP RUN RETURNING 1
END-IF.
* CALL "LIXAXIDSERIALIZE" USING TX-INFO-AREA LIXA-SER-XID
* TX-STATUS.
* DISPLAY ' XID-REC/FORMAT-ID: ' FORMAT-ID.
* DISPLAY ' XID-REC/GTRID-LENGTH: ' GTRID-LENGTH.
* DISPLAY ' XID-REC/BRANCH-LENGTH: ' BRANCH-LENGTH.
* DISPLAY ' XID-REC/XID (SERIAL.): ' LIXA-SER-XID.
* DISPLAY ' TRANSACTION-MODE : ' TRANSACTION-MODE.
* IF TX-NOT-IN-TRAN THEN
* DISPLAY ' [TX-NOT-IN-TRAN]'.
* IF TX-IN-TRAN THEN
* DISPLAY ' [TX-IN-TRAN]'.
* DISPLAY ' COMMIT-RETURN : ' COMMIT-RETURN.
* IF TX-COMMIT-COMPLETED THEN
* DISPLAY ' [TX-COMMIT-COMPLETED]'.
* IF TX-COMMIT-DECISION-LOGGED THEN
* DISPLAY ' [TX-COMMIT-DECISION-LOGGED]'.
* DISPLAY ' TRANSACTION-CONTROL : ' TRANSACTION-CONTROL.
* IF TX-UNCHAINED THEN
* DISPLAY ' [TX-UNCHAINED]'.
* IF TX-CHAINED THEN
* DISPLAY ' [TX-CHAINED]'.
* DISPLAY ' TRANSACTION-TIMEOUT : ' TRANSACTION-TIMEOUT.
* IF NO-TIMEOUT THEN
* DISPLAY ' [NO-TIMEOUT]'.
* DISPLAY ' TRANSACTION-STATE : ' TRANSACTION-STATE.
* IF TX-ACTIVE THEN
* DISPLAY ' [TX-ACTIVE]'.
* IF TX-TIMEOUT-ROLLBACK-ONLY THEN
* DISPLAY ' [TX-TIMEOUT-ROLLBACK-ONLY]'.
* IF TX-ROLLBACK-ONLY THEN
* DISPLAY ' [TX-ROLLBACK-ONLY]'.
*
| 40.346154 | 72 | 0.546076 |
10cd47189ac9e6253d367dc4cee0d5aabcf3e782 | 478 | cobol | COBOL | Task/Arithmetic-Complex/COBOL/arithmetic-complex-1.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Arithmetic-Complex/COBOL/arithmetic-complex-1.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Arithmetic-Complex/COBOL/arithmetic-complex-1.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | $SET SOURCEFORMAT "FREE"
$SET ILUSING "System"
$SET ILUSING "System.Numerics"
class-id Prog.
method-id. Main static.
procedure division.
declare num as type Complex = type Complex::ImaginaryOne()
declare results as type Complex occurs any
set content of results to ((num + num), (num * num), (- num), (1 / num), type Complex::Conjugate(num))
perform varying result as type Complex thru results
display result
end-perform
end method.
end class.
| 31.866667 | 106 | 0.698745 |
cee9ece26fba9b150e1ce812485473ea52f3a44e | 1,372 | cobol | COBOL | Task/Execute-HQ9+/COBOL/execute-hq9+.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Execute-HQ9+/COBOL/execute-hq9+.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Execute-HQ9+/COBOL/execute-hq9+.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. Exec-Hq9.
DATA DIVISION.
LOCAL-STORAGE SECTION.
78 Code-Length VALUE 256.
01 i PIC 999.
01 accumulator PIC 999.
01 bottles PIC 999.
LINKAGE SECTION.
01 hq9-code PIC X(Code-Length).
PROCEDURE DIVISION USING BY VALUE hq9-code.
PERFORM VARYING i FROM 1 BY 1 UNTIL Code-Length < i
EVALUATE hq9-code (i:1)
WHEN "Q"
DISPLAY FUNCTION TRIM(hq9-code)
WHEN "H"
DISPLAY "Hello, World!"
WHEN "9"
MOVE 99 TO bottles
PERFORM UNTIL bottles = ZERO
DISPLAY
bottles " bottles of beer on the wall"
DISPLAY bottles " bottles of beer"
DISPLAY "Take one down, pass it around"
SUBTRACT 1 FROM bottles
DISPLAY
bottles " bottles of beer on the wall"
DISPLAY SPACE
END-PERFORM
WHEN "+"
ADD 1 TO accumulator
END-EVALUATE
END-PERFORM
GOBACK
.
| 30.488889 | 69 | 0.419825 |
6fec3a503f49dad43760f17ba738e6cf2595a582 | 767 | cobol | COBOL | Task/Tokenize-a-string/COBOL/tokenize-a-string.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Tokenize-a-string/COBOL/tokenize-a-string.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Tokenize-a-string/COBOL/tokenize-a-string.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | identification division.
program-id. tokenize.
environment division.
configuration section.
repository.
function all intrinsic.
data division.
working-storage section.
01 period constant as ".".
01 cmma constant as ",".
01 start-with.
05 value "Hello,How,Are,You,Today".
01 items.
05 item pic x(6) occurs 5 times.
procedure division.
tokenize-main.
unstring start-with delimited by cmma
into item(1) item(2) item(3) item(4) item(5)
display trim(item(1)) period trim(item(2)) period
trim(item(3)) period trim(item(4)) period
trim(item(5))
goback.
end program tokenize.
| 24.741935 | 56 | 0.563233 |
b561b9b575ab96e50b4a2686e3e4f5058ffe5261 | 134 | cobol | COBOL | Task/Variables/COBOL/variables-6.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Variables/COBOL/variables-6.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Variables/COBOL/variables-6.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | 01 group-item VALUE "Hello!12345".
03 a-string PIC X(6). *> Contains "Hello!"
03 a-number PIC 9(5). *> Contains '12345'.
| 33.5 | 47 | 0.597015 |
42abf91b3ad41265455d97b95d4a21e425ad66d1 | 1,005 | cbl | COBOL | src/test/resources/InputSORT.cbl | gfour/antlr2datalog | 8f1da1b4ab4d948c06b143a7d9a5823c5e65d380 | [
"MIT"
] | 5 | 2020-12-28T11:49:14.000Z | 2022-03-23T00:52:06.000Z | src/test/resources/InputSORT.cbl | gfour/antlr2datalog | 8f1da1b4ab4d948c06b143a7d9a5823c5e65d380 | [
"MIT"
] | null | null | null | src/test/resources/InputSORT.cbl | gfour/antlr2datalog | 8f1da1b4ab4d948c06b143a7d9a5823c5e65d380 | [
"MIT"
] | 2 | 2021-12-16T03:04:03.000Z | 2021-12-17T16:56:33.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. InputSort.
*> AUTHOR. Michael Coughlan
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT StudentFile ASSIGN TO "SORTSTUD.DAT"
ORGANIZATION IS LINE SEQUENTIAL.
SELECT WorkFile ASSIGN TO "WORK.TMP".
DATA DIVISION.
FILE SECTION.
FD StudentFile.
01 StudentDetails PIC X(30).
SD WorkFile.
01 WorkRec.
02 WStudentId PIC 9(7).
02 FILLER PIC X(23).
PROCEDURE DIVISION.
Begin.
SORT WorkFile ON ASCENDING KEY WStudentId
INPUT PROCEDURE IS GetStudentDetails
GIVING StudentFile.
STOP RUN.
GetStudentDetails.
DISPLAY "Enter student details using template below."
DISPLAY "Enter no data to end.".
DISPLAY "Enter - StudId, Surname, Initials, YOB, MOB, DOB, Course, Gender"
DISPLAY "NNNNNNNSSSSSSSSIIYYYYMMDDCCCCG"
ACCEPT WorkRec.
PERFORM UNTIL WorkRec = SPACES
RELEASE WorkRec
ACCEPT WorkRec
END-PERFORM.
| 22.840909 | 79 | 0.671642 |
5403a8f37da172f78424e7da0525c2c6170e9207 | 1,106 | cbl | COBOL | cobol/testdata/local/testantlr127.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr127.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr127.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | 000001 Identification Division.
000002 Program-ID. testantlr127.
000003 Data Division.
000004 Working-Storage Section.
000005
000006*
000007*comment
000008*
000009
000010 01 CONSTANTS.
000011 05 MYNAME PIC X(012) VALUE 'testantlr127'.
000012
000013*
000014
000015 01 WORK-AREAS.
000016 05 X PIC X USAGE IS DISPLAY VALUE IS 'ABC
000017-'DEFGHIJKLMNOPQRSTUVWXYZ";:,./<>?1234567890-=!@#$%^&*()_+\|abcdef
000018-'ghijklmnopqrstuvwxyz '.
000019 05 A PIC X USAGE IS DISPLAY VALUE IS "ABC
000020-"DEFGHIJKLMNOPQRSTUVWXYZ';:,./<>?1234567890-=!@#$%^&*()_+\|abcdef
000021-"ghijklmnopqrstuvwxyz ".
000022
000023 Procedure Division.
000024 DISPLAY MYNAME ' Begin'
000025
000026 IF X = "ABCDEFGHIJKLMNOPQRSTUVWXYZ';:,./<>?\|1234567890!@#$%^
000027-"&*()-=_+ ." DISPLAY MYNAME 'IS EQUAL' END-IF
000028
000029 IF A EQUAL TO 'ABCDEFGHIJKLMNOPQRSTUVWXYZ";:,./<>?\|123456789
000030-'0!@#$%^&*()-=_+ .' DISPLAY MYNAME 'IS EQUAL' END-IF
000031
000032
000033 DISPLAY MYNAME ' End'
000034
000035 GOBACK
000036 .
000037
000038
| 28.358974 | 72 | 0.669982 |
9eacf0300f717f47e289c5caf3eaf246bbebf6d7 | 784 | cbl | COBOL | cobol/testdata/local/testantlr028.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr028.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr028.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | Identification Division.
Program-ID. testantlr028.
Data Division.
Working-Storage Section.
*
*comment
*
01 CONSTANTS.
05 MYNAME PIC X(012) VALUE 'testantlr028'.
*
01 WORK-AREAS.
05 X PIC X USAGE IS DISPLAY VALUE 'X'.
Local-Storage Section.
01 LOCAL-WORK-AREAS.
05 Y PIC X VALUE 'Y'.
Linkage Section.
01 PARM-DATA.
05 PARM-DATA-LEN PIC S9(004) COMP-5.
05 PARM-DATA-VAL PIC X(100).
Procedure Division Using PARM-DATA.
DISPLAY MYNAME ' Begin'
DISPLAY MYNAME ' End'
GOBACK
.
| 21.189189 | 70 | 0.44898 |
a93fe983fcb64b42653b1edda213f7d5dee2f3a0 | 330 | cob | COBOL | samples/hellopgm/hello.cob | jmptrader/CobolScript | dcf0e957c1b7cb7731116e5a56439d92d8aa2ca1 | [
"MIT"
] | 158 | 2015-02-13T19:41:43.000Z | 2022-03-19T20:41:56.000Z | samples/hellopgm/hello.cob | jmptrader/CobolScript | dcf0e957c1b7cb7731116e5a56439d92d8aa2ca1 | [
"MIT"
] | 5 | 2015-06-21T19:08:54.000Z | 2020-12-16T15:18:56.000Z | samples/hellopgm/hello.cob | jmptrader/CobolScript | dcf0e957c1b7cb7731116e5a56439d92d8aa2ca1 | [
"MIT"
] | 31 | 2015-01-14T21:25:04.000Z | 2022-03-15T22:20:02.000Z | identification division.
program-id. hello.
author. A.J.Lopez.
installation. test.
date-written. 2012-12-22.
date-compiled. 2012-12-22.
environment division.
configuration section.
source-computer. node.
object-computer. node.
data division.
procedure division.
display "Hello, world".
| 330 | 330 | 0.681818 |
9e768249ce4a7e22c41782d98cd505ad80daf154 | 141 | cbl | COBOL | COBOL/HelloWorld.cbl | tanay-pingalkar/HelloWorld | 0520e8dc58add8f8ea1ba0dc5841cb38894f7028 | [
"MIT"
] | 48 | 2021-01-16T19:50:43.000Z | 2021-11-27T10:40:39.000Z | COBOL/HelloWorld.cbl | TruncatedDinosour/HelloWorld | e3bf1556de1e67487ba7df8d5a30896ebf0f0c65 | [
"MIT"
] | 33 | 2021-03-02T23:28:41.000Z | 2022-02-19T11:02:11.000Z | COBOL/HelloWorld.cbl | TruncatedDinosour/HelloWorld | e3bf1556de1e67487ba7df8d5a30896ebf0f0c65 | [
"MIT"
] | 31 | 2021-01-17T07:27:10.000Z | 2022-02-18T20:36:53.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. HELLO-WORLD.
ENVIRONMENT DIVISION.
DATA DIVISION.
PROCEDURE DIVISION.
DISPLAY "Hello World!".
STOP RUN.
| 17.625 | 24 | 0.801418 |
de66e627aa3814fee09278b96202406fe4cf9fb3 | 8,553 | cpy | COBOL | api/cpy/SSDB.cpy | yupk/ssdb | bbf3bfa921df163a5589f550c91084adb9750221 | [
"BSD-3-Clause"
] | null | null | null | api/cpy/SSDB.cpy | yupk/ssdb | bbf3bfa921df163a5589f550c91084adb9750221 | [
"BSD-3-Clause"
] | null | null | null | api/cpy/SSDB.cpy | yupk/ssdb | bbf3bfa921df163a5589f550c91084adb9750221 | [
"BSD-3-Clause"
] | null | null | null | /**
* Copyright (c) 2012, ideawu
* All rights reserved.
* @author: ideawu
* @link: http://www.ideawu.com/
*
* SSDB Cpy client SDK.
*/
import socket;
class SSDB_Response{
function init(code='', data_or_message=null){
this.code = code;
this.data = null;
this.message = null;
if(code == 'ok'){
this.data = data_or_message;
}else{
this.message = data_or_message;
}
}
function __repr__(){
return str(this.code) + ' ' + str(this.message) + ' ' + str(this.data);
}
function ok(){
return this.code == 'ok';
}
function not_found(){
return this.code == 'not_found';
}
}
class SSDB{
function init(host, port){
this.recv_buf = '';
this._closed = false;
this.sock = socket.socket(socket.AF_INET, socket.SOCK_STREAM);
this.sock.connect(tuple([host, port]));
this.sock.setsockopt(socket.IPPROTO_TCP, socket.TCP_NODELAY, 1);
}
function close(){
if(!this._closed){
this.sock.close();
this._closed = True;
}
}
function closed(){
return this._closed;
}
function request(cmd, params=null){
if(params == null){
params = [];
}
params = [cmd] + params;
this.send(params);
resp = this.recv();
if(resp == null){
return new SSDB_Response('error', 'Unknown error');
}
if(len(resp) == 0){
return new SSDB_Response('disconnected', 'Connection closed');
}
switch(cmd){
case 'set':
case 'zset':
case 'hset':
case 'qpush':
case 'qpush_front':
case 'qpush_back':
case 'del':
case 'zdel':
case 'hdel':
case 'multi_set':
case 'multi_del':
case 'multi_hset':
case 'multi_hdel':
case 'multi_zset':
case 'multi_zdel':
if(len(resp) > 1){
return new SSDB_Response(resp[0], int(resp[1]));
}else{
return new SSDB_Response(resp[0], 1);
}
break;
case 'get':
case 'getset':
case 'hget':
case 'qfront':
case 'qback':
case 'qget':
case 'qpop':
case 'qpop_front':
case 'qpop_back':
if(resp[0] == 'ok'){
if(len(resp) == 2){
return new SSDB_Response('ok', resp[1]);
}else{
return new SSDB_Response('server_error', 'Invalid response');
}
}else{
return new SSDB_Response(resp[0]);
}
break;
case 'setnx':
case 'incr':
case 'decr':
case 'zincr':
case 'zdecr':
case 'hincr':
case 'hdecr':
case 'hsize':
case 'zsize':
case 'qsize':
case 'zget':
case 'zrank':
case 'zrrank':
case 'zsum':
case 'zcount':
case 'zavg':
case 'zremrangebyrank':
case 'zremrangebyscore':
case 'hclear':
case 'zclear':
case 'qclear':
case 'qpush':
case 'qpush_front':
case 'qpush_back':
if(resp[0] == 'ok'){
if(len(resp) == 2){
try{
if(cmd == 'zavg'){
val = float(resp[1]);
}else{
val = int(resp[1]);
}
return new SSDB_Response('ok', val);
}catch(Exception e){
return new SSDB_Response('server_error', 'Invalid response');
}
}else{
return new SSDB_Response('server_error', 'Invalid response');
}
}else{
return new SSDB_Response(resp[0]);
}
break;
case 'keys':
case 'zkeys':
case 'hkeys':
case 'hlist':
case 'zlist':
data = [];
if(resp[0] == 'ok'){
for(i=1; i<len(resp); i++){
data.append(resp[i]);
}
}
return new SSDB_Response(resp[0], data);
break;
case 'scan':
case 'rscan':
case 'hgetall':
case 'hscan':
case 'hrscan':
if(resp[0] == 'ok'){
if(len(resp) % 2 == 1){
data = {'index':[], 'items':{}};
for(i=1; i<len(resp); i+=2){
k = resp[i];
v = resp[i + 1];
data['index'].append(k);
data['items'][k] = v;
}
return new SSDB_Response('ok', data);
}else{
return new SSDB_Response('server_error', 'Invalid response');
}
}else{
return new SSDB_Response(resp[0]);
}
break;
case 'zscan':
case 'zrscan':
case 'zrange':
case 'zrrange':
if(resp[0] == 'ok'){
if(len(resp) % 2 == 1){
data = {'index':[], 'items':{}};
for(i=1; i<len(resp); i+=2){
k = resp[i];
v = resp[i + 1];
try{
v = int(v);
}catch(Exception e){
v = -1;
}
data['index'].append(k);
data['items'][k] = v;
}
return new SSDB_Response('ok', data);
}else{
return new SSDB_Response('server_error', 'Invalid response');
}
}else{
return new SSDB_Response(resp[0]);
}
break;
case 'exists':
case 'hexists':
case 'zexists':
data = false;
if(resp[0] == 'ok'){
if(len(resp) >= 2){
if(resp[1] == '1'){
data = true;
}
}
}
return new SSDB_Response(resp[0], data);
break;
case 'multi_exists':
case 'multi_hexists':
case 'multi_zexists':
data = {};
if(len(resp) % 2 == 1){
for(i=1; i<len(resp); i+=2){
k = resp[i];
if(resp[i + 1] == '1'){
v = true;
}else{
v = false;
}
data[k] = v;
}
}
return new SSDB_Response('ok', data);
break;
case 'multi_get':
case 'multi_hget':
if(resp[0] == 'ok'){
if(len(resp) % 2 == 1){
data = {};
for(i=1; i<len(resp); i+=2){
k = resp[i];
v = resp[i + 1];
data[k] = v;
}
return new SSDB_Response('ok', data);
}else{
return new SSDB_Response('server_error', 'Invalid response');
}
}else{
return new SSDB_Response(resp[0]);
}
break;
case 'multi_hsize':
case 'multi_zsize':
case 'multi_zget':
if(resp[0] == 'ok'){
if(len(resp) % 2 == 1){
data = {};
for(i=1; i<len(resp); i+=2){
k = resp[i];
v = int(resp[i + 1]);
data[k] = v;
}
return new SSDB_Response('ok', data);
}else{
return new SSDB_Response('server_error', 'Invalid response');
}
}else{
return new SSDB_Response(resp[0]);
}
break;
default:
if(len(resp) > 1){
data = [];
for(i=1; i<len(resp); i++){
data.append(resp[i]);
}
}else{
data = '';
}
return new SSDB_Response(resp[0], data);
break;
}
return new SSDB_Response('error', 'Unknown error');
}
function send(data){
ps = [];
foreach(data as p){
p = str(p);
ps.append(str(len(p)));
ps.append(p);
}
nl = '\n';
s = nl.join(ps) + '\n\n';
#print '> ' + repr(s);
try{
while(true){
ret = this.sock.send(s);
if(ret == 0){
return -1;
}
s = s[ret .. ];
if(len(s) == 0){
break;
}
}
}catch(socket.error e){
return -1;
}
//except socket.error as (val, msg):
return ret;
}
function net_read(){
try{
data = this.sock.recv(1024*8);
#print '< ' + repr(data);
}catch(Exception e){
data = '';
}
if(data == ''){
this.close();
return 0;
}
this.recv_buf += data;
return len(data);
}
function recv(){
while(true){
ret = this.parse();
if(ret == null){
if(this.net_read() == 0){
return [];
}
}else{
return ret;
}
}
}
function parse(){
//if(len(this.recv_buf)){print 'recv_buf: ' + repr(this.recv_buf);}
ret = [];
spos = 0;
epos = 0;
while(true){
spos = epos;
epos = this.recv_buf.find('\n', spos);
if(epos == -1){
break;
}
epos += 1;
line = this.recv_buf[spos .. epos];
spos = epos;
if(line.strip() == ''){ // head end
if(len(ret) == 0){
continue;
}else{
this.recv_buf = this.recv_buf[spos .. ];
return ret;
}
}
try{
num = int(line);
}catch(Exception e){
// error
return [];
}
epos = spos + num;
if(epos > len(this.recv_buf)){
break;
}
data = this.recv_buf[spos .. epos];
ret.append(data);
spos = epos;
epos = this.recv_buf.find('\n', spos);
if(epos == -1){
break;
}
epos += 1;
}
return null;
}
} | 21.329177 | 74 | 0.477844 |
a696772c4e00a7f5dc95a84c26bae03b399e9f39 | 814 | cob | COBOL | hello.cob | tseiiti/cobol | c1817d7e254c3a7dfc73a3b21c7f4263c4984f7b | [
"MIT"
] | null | null | null | hello.cob | tseiiti/cobol | c1817d7e254c3a7dfc73a3b21c7f4263c4984f7b | [
"MIT"
] | null | null | null | hello.cob | tseiiti/cobol | c1817d7e254c3a7dfc73a3b21c7f4263c4984f7b | [
"MIT"
] | null | null | null | identification division.
program-id. hello.
environment division.
source-computer. xxx-zos.
object-computer. xxx-zos.
input-output section.
file-control.
select file assign to ddname
organization is sequential.
data division.
working-storage section.
01 ws-id pic 9(5).
01 ws-a pic 9 value 0.
procedure division.
display "Hello World!" with no advancing
display " Teste".
a0000-first-para section.
first-paragraph.
accept ws-id
move '10' to ws-id
display ws-id.
a-para.
perform b-para varying ws-a from 1 by 1 until ws-a = 5.
stop run.
b-para.
display 'in b-para ' ws-a.
| 23.257143 | 66 | 0.531941 |
80fd151491bacc37bcf01e78148be0ec772bdf43 | 3,670 | cob | COBOL | test/data/COBOL-68/mccracken2.cob | jfitz/code-stat | dd2a13177f3ef03ab42123ef3cfcbbd062a2ae26 | [
"MIT"
] | null | null | null | test/data/COBOL-68/mccracken2.cob | jfitz/code-stat | dd2a13177f3ef03ab42123ef3cfcbbd062a2ae26 | [
"MIT"
] | null | null | null | test/data/COBOL-68/mccracken2.cob | jfitz/code-stat | dd2a13177f3ef03ab42123ef3cfcbbd062a2ae26 | [
"MIT"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID.
ONELEVEL.
ENVIRONMENT DIVISION.
CONFIGURATION SECTION.
SPECIAL-NAMES.
C01 IS TO-TOP-OF-PAGE.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT INPUT-FILE ASSIGN TO UT-S-CARDS.
SELECT REPORT-FILE ASSIGN TO UT-S-PRINTER.
DATA DIVISION.
FILE SECTION.
FD INPUT-FILE
LABEL RECORDS ARE OMITTED.
01 INPUT-RECORD.
05 ACCOUNT-NUMBER PIC X(5).
05 ACCOUNT-DOLLARS PIC 9(5)V99.
05 FILLER PIC X(68).
FD REPORT-FILE
LABEL RECORDS ARE OMITTED.
01 REPORT-RECORD PIC X(133).
WORKING-STORAGE SECTION.
01 FLAGS.
05 MORE-DATA-REMAINS-FLAG PIC XXX VALUE 'YES'
88 MORE-DATA-REMAINS VALUE 'YES'
88 NO-MORE-DATA-REMAINS VALUE 'NO'.
01 LINE-AND-PAGE-COUNTERS.
05 LINE-NUMBER PIC $99 VALUE +1.
05 PAGE-NUMBER PIC $999 VALUE +1.
01 SAVE-ITEM.
05 PREVIOUS-ACCOUNT-NUMBER PIC X(5).
01 TOTALS.
05 ACCOUNT-TOTAL PIC $9(6)V99 VALUE ZERO.
05 FINAL-TOTAL PIC $9(6)V99 VALUE ZERO.
01 DETAIL-LINE.
05 CARRIAGE-CONTROL PIC X.
05 ACCOUNT-NUMBER-OUT PIC ZZZZ9.
05 FILLER PIC XXX.
05 ACCOUNT-TOTAL-OUT PIC $$$$,$$9.99.
05 FILLER PIC X(8).
05 FINAL-TOTAL-OUT PIC $$$$,$$9.99.
01 HEADING-LINE.
05 CARRIAGE-CONTROL PIC X.
05 FILLER PIC X(48) VALUE 'ACCOUNT TOTAL FINAL TOTAL PAGE'.
05 PAGE-NUMBER-OUT PIC Z(6)9.
PROCEDURE DIVISION.
PREPARE-SALES-REPORT.
OPEN INPUT INPUT-FILE
OUTPUT REPORT-FILE.
READ INPUT-FILE
AT END MOVE 'NO' TO MORE-DATA-REMAINS-FLAG.
IF MORE-DATA-REMAINS
MOVE ACCOUNT-NUMBER TO PREVIOUS-ACCOUNT-NUMBER
PERFORM PROCESS-INPUT-RECORDS
UNTIL NO-MORE-DATA-REMAINS
PERFORM FINAL-TOTAL-PROCESSING.
CLOSE INPUT-FILE
REPORT-FILE.
STOP RUN.
PROCESS-INPUT-RECORDS.
IF ACCOUNT-NUMBER IS NOT EQUAL TO PREVIOUS-ACCOUNT-NUMBER
PERFORM ACCOUNT-TOTAL-PROCESSING.
ADD ACCOUNT-DOLLARS TO ACCOUNT-TOTAL
FINAL-TOTAL.
READ INPUT-FILE
AT END MOVE 'NO' TO MORE-DATA-REMAINS-FLAG.
FINAL-TOTAL-PROCESSING.
PERFORM ACCOUNT-TOTAL-PROCESSING.
MOVE SPACES TO DETAIL-LINE.
MOVE FINAL-TOTAL TO FINAL-TOTAL-OUT.
PERFORM LINE-OUT.
ACCOUNT-TOTAL-PROCESSING.
MOVE SPACES TO DETAIL-LINE.
MOVE PREVIOUS-ACCOUNT-NUMBER TO ACCOUNT-NUMBER-OUT.
MOVE ACCOUNT-TOTAL TO ACCOUNT-TOTAL-OUT.
PERFORM LINE-OUT.
MOVE ACCOUNT-NUMBER TO PREVIOUS-ACCOUNT-NUMBER.
MOVE ZERO TO ACCOUNT-TOTAL.
LINE-OUT.
IF LINE-NUMBER = 1
MOVE PAGE-NUMBER TO PAGE-NUMBER-OUT
WRITE REPORT-RECORD FROM HEADING-LINE
AFTER ADVANCING TO-TOP-OF-PAGE
MOVE SPACES TO REPORT-RECORD
WRITE REPORT-RECORD AFTER ADVANCING 2 LINES
MOVE 4 TO LINE-NUMBER
ADD 1 TO PAGE-NUMBER.
WRITE REPORT-RECORD FROM DETAIL-LINE AFTER ADVANCING 1 LINES.
IF LINE-NUMBER = 55
MOVE 1 TO LINE-NUMBER
ELSE
ADD 1 TO LINE-NUMBER.
| 33.363636 | 72 | 0.537057 |
ef227daa7a28244e1fe1d0f264f23c853d6d355e | 31 | cob | COBOL | Data/Levels/dabiz/BGObjects/domeglass.cob | ForsakenW/skeleton | d981a0f42c378386df07cc0c6e55b6eb1dd5a9b3 | [
"MIT"
] | 1 | 2018-05-06T16:57:26.000Z | 2018-05-06T16:57:26.000Z | Data/Levels/dabiz/BGObjects/domeglass.cob | ForsakenW/skeleton | d981a0f42c378386df07cc0c6e55b6eb1dd5a9b3 | [
"MIT"
] | null | null | null | Data/Levels/dabiz/BGObjects/domeglass.cob | ForsakenW/skeleton | d981a0f42c378386df07cc0c6e55b6eb1dd5a9b3 | [
"MIT"
] | null | null | null | PRJX domeglass.mx | 31 | 31 | 0.483871 |
1e212c21a5b6a0d73bfde29562030e981de75040 | 1,567 | cpy | COBOL | CopyBooks/FAKERLS1.cpy | dinodev76/COB-FAKER | 984e44a309d8d52a7a376a647f049d0a40cd75fb | [
"MIT"
] | 1 | 2020-08-17T20:18:48.000Z | 2020-08-17T20:18:48.000Z | CopyBooks/FAKERLS1.cpy | dinodev76/COB-FAKER | 984e44a309d8d52a7a376a647f049d0a40cd75fb | [
"MIT"
] | null | null | null | CopyBooks/FAKERLS1.cpy | dinodev76/COB-FAKER | 984e44a309d8d52a7a376a647f049d0a40cd75fb | [
"MIT"
] | null | null | null | *========================== COB-FAKER ===========================*
* Authors: Brian D Pead
*
* License: MIT
*
* Date Version Description
* ---- ------- -----------
* 2020-02-08 1.0 First release
*================================================================*
01 L-FORMAT-TABLE-1.
05 L-FORMAT-ENTRY-CNT-1
PIC S9(4) COMP.
05 L-FORMAT-WEIGHT-TOT-1
PIC S99V9(9)
COMP.
05 L-FORMAT-OCCS-1.
10 FILLER OCCURS 10
INDEXED L-F-DX-1.
15 L-FORMAT-ENTRY-1
PIC X(32).
15 L-FORMAT-WEIGHT-1
PIC SV9(9) COMP.
01 L-FORMAT-TABLE-2.
05 L-FORMAT-ENTRY-CNT-2
PIC S9(4) COMP.
05 L-FORMAT-WEIGHT-TOT-2
PIC S99V9(9)
COMP.
05 L-FORMAT-OCCS-2.
10 FILLER OCCURS 10
INDEXED L-F-DX-2.
15 L-FORMAT-ENTRY-2
PIC X(32).
15 L-FORMAT-WEIGHT-2
PIC SV9(9) COMP.
| 41.236842 | 73 | 0.261008 |
0cc0ee08ad93f5f42799b2c581eb250e84380b4b | 2,015 | cbl | COBOL | z86842/cbl/cobol.cbl | kevingabayan/cobol-programming-course | 22abf22df4bc079dbf8d31dde1965ff00268c466 | [
"CC-BY-4.0"
] | null | null | null | z86842/cbl/cobol.cbl | kevingabayan/cobol-programming-course | 22abf22df4bc079dbf8d31dde1965ff00268c466 | [
"CC-BY-4.0"
] | null | null | null | z86842/cbl/cobol.cbl | kevingabayan/cobol-programming-course | 22abf22df4bc079dbf8d31dde1965ff00268c466 | [
"CC-BY-4.0"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. ADDONE.
AUTHOR. STUDENT.
*
ENVIRONMENT DIVISION.
*
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT PRT-LINE ASSIGN TO PRTLINE.
SELECT PRT-DONE ASSIGN TO PRTDONE.
DATA DIVISION.
FILE SECTION.
FD PRT-LINE RECORD CONTAINS 5 CHARACTERS RECORDING MODE F.
01 PRT-REC PIC 9(05).
FD PRT-DONE RECORD CONTAINS 80 CHARACTERS RECORDING MODE F.
01 PRT-REC-DONE.
05 PRT-DATE PIC X(8).
05 FILLER PIC X(1).
05 PRT-TIME PIC X(4).
05 FILLER PIC X(2).
05 PRT-COMMENT PIC X(27).
05 FILLER PIC X(2).
05 MY-NAME PIC X(36).
WORKING-STORAGE SECTION.
01 PGM-VARIABLES.
05 PGM-COUNT PIC 9(05).
01 YYYYMMDD PIC 9(8).
01 INTEGER-FORM PIC S9(9).
01 REFMOD-TIME-ITEM PIC X(8).
****************************************************************
* PROCEDURE DIVISION *
****************************************************************
PROCEDURE DIVISION.
*
A000-START.
OPEN OUTPUT PRT-LINE.
PERFORM A000-COUNT 10 TIMES.
PERFORM A000-DONE.
CLOSE PRT-LINE.
GOBACK.
*
A000-COUNT.
ADD 1 TO PGM-COUNT.
* DISPLAY PGM-COUNT.
WRITE PRT-REC FROM PGM-COUNT AFTER ADVANCING 1 LINE.
*
A000-DONE.
OPEN OUTPUT PRT-DONE.
ACCEPT REFMOD-TIME-ITEM FROM TIME.
MOVE FUNCTION CURRENT-DATE(1:8) TO YYYYMMDD.
MOVE YYYYMMDD TO PRT-DATE.
MOVE REFMOD-TIME-ITEM (1:4) TO PRT-TIME.
MOVE "My first z/OS COBOL program" TO PRT-COMMENT.
WRITE PRT-REC-DONE.
CLOSE PRT-DONE.
| 31.484375 | 71 | 0.448635 |
2f94381588b7bd1c432e3b06e7dd257fb9fa00dd | 906 | cbl | COBOL | third_party/universal-ctags/ctags/Units/parser-cobol.r/simple.cbl.d/input.cbl | f110/wing | 31b259f723b57a6481252a4b8b717fcee6b01ff4 | [
"MIT"
] | 4 | 2017-02-07T20:04:31.000Z | 2022-01-30T14:04:45.000Z | third_party/universal-ctags/ctags/Units/parser-cobol.r/simple.cbl.d/input.cbl | f110/wing | 31b259f723b57a6481252a4b8b717fcee6b01ff4 | [
"MIT"
] | 1 | 2018-01-07T19:14:53.000Z | 2018-01-07T19:14:53.000Z | third_party/universal-ctags/ctags/Units/parser-cobol.r/simple.cbl.d/input.cbl | f110/wing | 31b259f723b57a6481252a4b8b717fcee6b01ff4 | [
"MIT"
] | 1 | 2021-04-26T09:00:06.000Z | 2021-04-26T09:00:06.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. Program-Name.
AUTHOR. Darren Hiebert.
ENVIRONMENT DIVISION.
INPUT-OUPUT SECTION.
FILE-CONTROL.
SELECT File-Name ASSIGN TO "SAMPLE.DAT"
ORGANIZATION IS LINE SEQUENTIAL.
DATA DIVISION.
FILE SECTION.
FD File-Name.
01 File-Group-Name.
02 File-Data-Item PIC 9(7).
WORKING-STORAGE SECTION.
01 Group-Name.
02 Data-Item1 PIC 9 VALUE ZEROS.
03 SH-WORK-MMDDYYYY PIC 9(08) VALUE 0.
03 SH-WORK-MMDDYYYY-2 REDEFINES SH-WORK-MMDDYYYY.
03 DW-DAYS-IN-MONTHS VALUE "312831303130313130313031".
05 DW-DAYS-IN-MONTH OCCURS 12 TIMES
PIC 9(02).
PROCEDURE DIVISION.
Begin.
STOP RUN.
Subprogram-Name.
| 29.225806 | 69 | 0.530905 |
86a0ea5e21c14b4aa10dc907c1d87a0cf1495f1d | 911 | cbl | COBOL | Variaveis.cbl | MarcoDSilva/Learning_Cobol | cd65087500023c89a81fbe310034cf3bfcff8a7e | [
"MIT"
] | 2 | 2019-09-04T21:07:51.000Z | 2020-04-19T03:49:33.000Z | Variaveis.cbl | MarcoDSilva/Learning_Cobol | cd65087500023c89a81fbe310034cf3bfcff8a7e | [
"MIT"
] | null | null | null | Variaveis.cbl | MarcoDSilva/Learning_Cobol | cd65087500023c89a81fbe310034cf3bfcff8a7e | [
"MIT"
] | 1 | 2020-04-26T00:19:20.000Z | 2020-04-26T00:19:20.000Z | ******************************************************************
* Author: Marco
* Date: 04/09/2019
* Purpose: Variaveis
* Tectonics: cobc
******************************************************************
IDENTIFICATION DIVISION.
PROGRAM-ID. variables.
DATA DIVISION.
FILE SECTION.
WORKING-STORAGE SECTION.
77 Numero PIC 9(18).
77 Nome PIC A(15).
77 alphanum PIC X(15).
77 num_dec pic 9(02).9(02).
PROCEDURE DIVISION.
MAIN-PROCEDURE.
display "insira num".
accept Numero.
display "insira nome".
accept nome.
display "insira alphanum".
accept alphanum.
display "insira num_dec".
accept num_dec.
STOP RUN.
END PROGRAM variables.
| 26.794118 | 73 | 0.411636 |
26d3e7edbd2225b5662a92c73d80f72bdf6edc7b | 79 | cobol | COBOL | Task/Hello-world-Text/COBOL/hello-world-text-1.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Hello-world-Text/COBOL/hello-world-text-1.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Hello-world-Text/COBOL/hello-world-text-1.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | program-id. hello.
procedure division.
display "Hello world!".
stop run.
| 15.8 | 25 | 0.696203 |
a8f665cd9eb1e7613f566876fca13657baeafd77 | 13,057 | cbl | COBOL | WoodgroveBank/ATM/CICSLU0Pgms/wbgetbal.cbl | mlindstr/AZ-Legacy-Engineering | 4d00742749375c6d3e3217799030d8b977d7433d | [
"MIT"
] | 1 | 2021-09-07T13:34:01.000Z | 2021-09-07T13:34:01.000Z | WoodgroveBank/ATM/CICSLU0Pgms/wbgetbal.cbl | mlindstr/AZ-Legacy-Engineering | 4d00742749375c6d3e3217799030d8b977d7433d | [
"MIT"
] | null | null | null | WoodgroveBank/ATM/CICSLU0Pgms/wbgetbal.cbl | mlindstr/AZ-Legacy-Engineering | 4d00742749375c6d3e3217799030d8b977d7433d | [
"MIT"
] | 2 | 2021-08-19T19:04:49.000Z | 2021-09-07T13:34:12.000Z | *****************************************************************
** THIS PROGRAM IS A SAMPLE CICS CLIENT FOR DEMONSTRATING A 3270*
** APPLICATION THAT READS AND WRITE TO A VSAM DATA SET FOR *
** BANKING TYPE OF INFORMATION. *
** *
** THE INPUT TO THIS CICS PROGRAM IS PROVIDED THROUGH A BMS MAP *
** THAT IS NAMED WGRVMAP. *
*****************************************************************
IDENTIFICATION DIVISION.
PROGRAM-ID. WBGETBAL.
ENVIRONMENT DIVISION.
DATA DIVISION.
*****************************************************************
** VARIABLES FOR INTERACTING WITH THE TERMINAL SESSION *
*****************************************************************
WORKING-STORAGE SECTION.
01 CUST-REC-KEY.
05 NAME PIC X(30) VALUE SPACES.
01 CUSTOMER-RECORD.
05 CUSTOMER-NAME PIC X(30).
05 CUSTOMER-SSN PIC X(9).
05 CUSTOMER-ADDRESS.
10 CUSTOMER-STREET PIC X(20).
10 CUSTOMER-CITY PIC X(10).
10 CUSTOMER-STATE PIC X(4).
10 CUSTOMER-ZIP PIC 9(5).
05 CUSTOMER-PHONE PIC X(13).
05 CUSTOMER-ACCESS-PIN PIC X(4).
01 ACCT-REC-KEY.
05 SSN PIC X(9) VALUE SPACES.
05 NUM PIC X(10) VALUE SPACES.
01 ACCOUNT-RECORD.
05 ACCOUNT-SSN PIC X(9).
05 ACCOUNT-NUMBER PIC X(10).
05 ACCOUNT-TYPE.
10 ACCOUNT-TYPE-CODE PIC X.
88 ACCOUNT-TYPE-CHK VALUE 'C'.
88 ACCOUNT-TYPE-SAV VALUE 'S'.
10 ACCOUNT-TYPE-NAME PIC X(10).
05 ACCOUNT-AREA PIC X(39).
05 ACCOUNT-TYPE-CHECKING REDEFINES ACCOUNT-AREA.
10 ACCOUNT-CHK-OD-CHG PIC S9(3)V99 COMP-3.
10 ACCOUNT-CHK-OD-LIMIT PIC S9(5)V99 COMP-3.
10 ACCOUNT-CHK-OD-LINK-ACCT PIC X(10).
10 ACCOUNT-CHK-LAST-STMT PIC X(10).
10 ACCOUNT-CHK-DETAIL-ITEMS PIC S9(7) COMP-3.
10 ACCOUNT-CHK-BAL PIC S9(13)V99 COMP-3.
05 ACCOUNT-TYPE-SAVINGS REDEFINES ACCOUNT-AREA.
10 ACCOUNT-SAV-INT-RATE PIC S9(1)V99 COMP-3.
10 ACCOUNT-SAV-SVC-CHRG PIC S9(3)V99 COMP-3.
10 ACCOUNT-SAV-LAST-STMT PIC X(10).
10 ACCOUNT-SAV-DETAIL-ITEMS PIC S9(7) COMP-3.
10 ACCOUNT-SAV-BAL PIC S9(13)V99 COMP-3.
10 FILLER PIC X(12).
01 TXN-REC-KEY.
05 SSN PIC X(9) VALUE SPACES.
05 NUM PIC X(10) VALUE SPACES.
05 ITEM-NUM PIC S9(7) COMP-3.
01 TXN-DETAILS.
05 TXN-SSN PIC X(9).
05 TXN-ACCT-NUM PIC X(10).
05 TXN-ITEM-NUM PIC S9(7) COMP-3.
05 TXN-TYPE PIC X.
88 TXN-TYPE-INITIAL-BALANCE VALUE 'B'.
88 TXN-TYPE-CREDIT VALUE 'C'.
88 TXN-TYPE-DEBIT VALUE 'D'.
88 TXN-TYPE-SVCCHG VALUE 'S'.
88 TXN-TYPE-ODCHG VALUE 'O'.
05 TXN-DATE PIC X(10).
05 TXN-AMOUNT PIC S9(13)V99 COMP-3.
01 INPUT-AREA.
05 IA-TRAN PIC X(4).
05 IA-ACCT-NUM PIC X(10).
05 IA-SSN PIC X(9).
01 OUTPUT-AREA.
05 OA-HEADER.
10 OA-FMH PIC X(3) VALUE X'034000'.
10 OA-STATUS-CODE PIC X VALUE SPACES.
05 OA-DATA.
10 OA-BALANCE PIC +9(9).99.
01 ERROR-CODES.
05 EC-OK PIC X VALUE '0'.
05 EC-INVALID-ACCT PIC X VALUE '1'.
05 EC-INVALID-PIN PIC X VALUE '2'.
05 EC-INVALID-SSN PIC X VALUE '3'.
05 EC-WOULD-OVERDRAW PIC X VALUE '4'.
05 EC-INVALID-XFER-ACCT PIC X VALUE '5'.
01 DONE PIC X VALUE 'N'.
01 RESP-CODE PIC S9(9) COMP VALUE +0.
01 WBCUSTDB-DD PIC X(8) VALUE 'WBCUSTDB'.
01 WBACCTDB-DD PIC X(8) VALUE 'WBACCTDB'.
01 WBTXNDB-DD PIC X(8) VALUE 'WBTXNDB'.
01 RET-CODE PIC S9(4) COMP VALUE 0.
01 INPUT-AREA-LEN PIC S9(4) COMP VALUE 0.
01 OUTPUT-AREA-LEN PIC S9(4) COMP VALUE 0.
01 HW-LENGTH PIC 9(4) COMP.
01 EDIT-NUM PIC Z,ZZZ,ZZ9.
01 START-REC-NUM PIC S9(9) COMP VALUE 1.
01 LOG-MSG.
05 LOG-ID PIC X(7) VALUE 'TASK #'.
05 TASK-NUMBER PIC 9(7).
05 FILLER PIC X VALUE SPACE.
05 LOG-MSG-BUFFER PIC X(80) VALUE SPACES.
01 ENABLE-LOGGING PIC X VALUE 'Y'.
88 LOGGING-IS-ENABLED VALUE 'Y'.
88 LOGGING-IS-DISABLED VALUE 'N'.
LINKAGE SECTION.
PROCEDURE DIVISION.
EXEC CICS RECEIVE INTO(INPUT-AREA)
MAXLENGTH (LENGTH OF INPUT-AREA)
LENGTH (INPUT-AREA-LEN)
RESP(RESP-CODE)
END-EXEC.
EVALUATE RESP-CODE
WHEN DFHRESP(EOC)
CONTINUE
WHEN DFHRESP(EODS)
GO TO WBGETBAL-EOC
WHEN DFHRESP(INBFMH)
GO TO WBGETBAL-INBFMH
WHEN DFHRESP(LENGERR)
GO TO WBGETBAL-LENGERR
WHEN DFHRESP(SIGNAL)
GO TO WBGETBAL-SIGNAL-RECV
WHEN DFHRESP(TERMERR)
GO TO WBGETBAL-TERMERR-RECV
WHEN OTHER
GO TO WBGETBAL-RECV-ERROR
END-EVALUATE.
MOVE SPACES TO LOG-MSG-BUFFER.
STRING 'Input Area:' DELIMITED SIZE
INPUT-AREA DELIMITED SIZE
INTO LOG-MSG-BUFFER
END-STRING.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
PERFORM GET-ACCT THRU GET-ACCT-EXIT.
IF RET-CODE = 0 THEN
MOVE LENGTH OF OUTPUT-AREA TO OUTPUT-AREA-LEN
MOVE EC-OK TO OA-STATUS-CODE
ELSE
MOVE LENGTH OF OA-HEADER OF OUTPUT-AREA TO
OUTPUT-AREA-LEN
END-IF.
EXEC CICS SEND FROM(OUTPUT-AREA)
FMH LAST LENGTH (OUTPUT-AREA-LEN)
END-EXEC.
GO TO END-WBGETBAL.
**************************************************
* READ THE ACCOUNT INFO FROM VSAM DATA SET
**************************************************
GET-ACCT.
MOVE IA-SSN TO SSN OF ACCT-REC-KEY.
MOVE IA-ACCT-NUM TO NUM OF ACCT-REC-KEY.
EXEC CICS READ
DATASET(WBACCTDB-DD)
INTO(ACCOUNT-RECORD)
LENGTH(LENGTH OF ACCOUNT-RECORD)
RIDFLD(ACCT-REC-KEY)
KEYLENGTH(LENGTH OF ACCT-REC-KEY)
RESP(RESP-CODE)
END-EXEC.
EVALUATE RESP-CODE
WHEN 0
MOVE SPACES TO LOG-MSG-BUFFER
MOVE 'RECORD FOUND' TO LOG-MSG-BUFFER
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT
EVALUATE ACCOUNT-TYPE-CODE
WHEN 'C'
MOVE ACCOUNT-CHK-BAL TO OA-BALANCE
WHEN 'S'
MOVE ACCOUNT-SAV-BAL TO OA-BALANCE
WHEN OTHER
MOVE ZERO TO OA-BALANCE
END-EVALUATE
GO TO GET-ACCT-EXIT
WHEN DFHRESP(ENDFILE)
GO TO GET-ACCT-ENDFILE
WHEN DFHRESP(NOTOPEN)
GO TO GET-ACCT-NOTOPEN
WHEN OTHER
GO TO GET-ACCT-ERROR
END-EVALUATE.
GO TO GET-ACCT-EXIT.
GET-ACCT-NOTOPEN.
MOVE SPACES TO LOG-MSG-BUFFER.
MOVE 'Account file not open' TO LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
MOVE 1 TO RET-CODE.
MOVE EC-INVALID-ACCT TO OA-STATUS-CODE.
GO TO GET-ACCT-EXIT.
GET-ACCT-ENDFILE.
MOVE SPACES TO LOG-MSG-BUFFER.
STRING 'Account number not found: ' DELIMITED SIZE
ACCOUNT-NUMBER DELIMITED SIZE
INTO LOG-MSG-BUFFER
END-STRING.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
MOVE 1 TO RET-CODE.
MOVE EC-INVALID-ACCT TO OA-STATUS-CODE.
GO TO GET-ACCT-EXIT.
GET-ACCT-ERROR.
MOVE SPACES TO LOG-MSG-BUFFER.
MOVE RESP-CODE TO EDIT-NUM.
STRING 'I/O error reading Account: Response Code='
DELIMITED SIZE
EDIT-NUM DELIMITED SIZE
INTO LOG-MSG-BUFFER
END-STRING.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
MOVE 1 TO RET-CODE.
MOVE EC-INVALID-ACCT TO OA-STATUS-CODE.
GO TO GET-ACCT-EXIT.
GET-ACCT-EXIT.
EXIT.
WBGETBAL-EOC.
MOVE 'Receive Condition: EOC' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-EOC-EXIT.
EXIT.
WBGETBAL-EODS.
MOVE 'Receive Condition: EODS' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-EODS-EXIT.
EXIT.
WBGETBAL-INBFMH.
MOVE 'Receive Condition: INBFMH' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-INBFMH-EXIT.
EXIT.
WBGETBAL-LENGERR.
MOVE 'Receive Condition: LENGERR' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-LENGERR-EXIT.
EXIT.
WBGETBAL-SIGNAL-RECV.
MOVE 'Receive Condition: SIGNAL' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-SIGNAL-RECV-EXIT.
EXIT.
WBGETBAL-TERMERR-RECV.
MOVE 'Receive Condition: TERMERR' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-TERMERR-RECV-EXIT.
EXIT.
WBGETBAL-RECV-ERROR.
MOVE RESP-CODE TO EDIT-NUM.
STRING 'Receive error: Response Code=' DELIMITED SIZE
EDIT-NUM DELIMITED SIZE
INTO LOG-MSG-BUFFER
END-STRING.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-RECV-ERROR-EXIT.
EXIT.
WBGETBAL-SIGNAL-SEND.
MOVE 'Send Condition: SIGNAL' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-SIGNAL-SEND-EXIT.
EXIT.
WBGETBAL-TERMERR-SEND.
MOVE 'Send Condition: TERMERR' to LOG-MSG-BUFFER.
PERFORM WRITE-LOG-MSG THRU WRITE-LOG-MSG-EXIT.
GO TO END-WBGETBAL.
WBGETBAL-TERMERR-SEND-EXIT.
EXIT.
*****************************************************************
* WRITE A MESSAGE OUT TO A CICS TRANSIENT DATA QUEUE *
*****************************************************************
WRITE-LOG-MSG.
IF LOGGING-IS-ENABLED THEN
MOVE LENGTH OF LOG-MSG TO HW-LENGTH
MOVE EIBTASKN TO TASK-NUMBER
EXEC CICS WRITEQ TD QUEUE('CSMT')
FROM(LOG-MSG)
LENGTH(HW-LENGTH)
NOHANDLE
END-EXEC
END-IF.
WRITE-LOG-MSG-EXIT.
EXIT.
END-WBGETBAL.
EXEC CICS RETURN END-EXEC.
END-WBGETBAL-EXIT.
EXIT.
| 37.846377 | 71 | 0.445815 |
582f10778bb242136caccfccd13b46b5d16a62ad | 114,093 | cpy | COBOL | resource/testdb/partsupp.cpy | IITDBGroup/perm_regression_tests | f9fb92ed54ef6ef3ec4d4f4792fc5a81e46ad4c8 | [
"PostgreSQL"
] | 5 | 2017-02-01T16:27:47.000Z | 2021-04-23T16:02:03.000Z | resource/testdb/partsupp.cpy | IITDBGroup/perm_regression_tests | f9fb92ed54ef6ef3ec4d4f4792fc5a81e46ad4c8 | [
"PostgreSQL"
] | 82 | 2016-11-30T15:57:48.000Z | 2022-03-04T21:35:03.000Z | resource/testdb/partsupp.cpy | IITDBGroup/perm_regression_tests | f9fb92ed54ef6ef3ec4d4f4792fc5a81e46ad4c8 | [
"PostgreSQL"
] | 4 | 2017-02-09T20:53:13.000Z | 2022-02-10T22:01:35.000Z | 1|2|3325|771.64|, even theodolites. regular, final theodolites eat after the carefully pending foxes. furiously regular deposits sleep slyly. carefully bold realms above the ironic dependencies haggle careful
1|4|8076|993.49|ven ideas. quickly even packages print. pending multipliers must have to are fluff
1|6|3956|337.09|after the fluffily ironic deposits? blithely special dependencies integrate furiously even excuses. blithely silent theodolites could have to haggle pending, express requests; fu
1|8|4069|357.84|al, regular dependencies serve carefully after the quickly final pinto beans. furiously even deposits sleep quickly final, silent pinto beans. fluffily reg
2|3|8895|378.49|nic accounts. final accounts sleep furiously about the ironic, bold packages. regular, regular accounts
2|5|4969|915.27|ptotes. quickly pending dependencies integrate furiously. fluffily ironic ideas impress blithely above the express accounts. furiously even epitaphs need to wak
2|7|8539|438.37|blithely bold ideas. furiously stealthy packages sleep fluffily. slyly special deposits snooze furiously carefully regular accounts. regular deposits according to the accounts nag carefully slyl
2|9|3025|306.39|olites. deposits wake carefully. even, express requests cajole. carefully regular ex
3|4|4651|920.92|ilent foxes affix furiously quickly unusual requests. even packages across the carefully even theodolites nag above the sp
3|6|4093|498.13|ending dependencies haggle fluffily. regular deposits boost quickly carefully regular requests. deposits affix furiously around the pinto beans. ironic, unusual platelets across the p
3|8|3917|645.40|of the blithely regular theodolites. final theodolites haggle blithely carefully unusual ideas. blithely even f
3|10|9942|191.92| unusual, ironic foxes according to the ideas detect furiously alongside of the even, express requests. blithely regular the
4|5|1339|113.97| carefully unusual ideas. packages use slyly. blithely final pinto beans cajole along the furiously express requests. regular orbits haggle carefully. care
4|7|6377|591.18|ly final courts haggle carefully regular accounts. carefully regular accounts could integrate slyly. slyly express packages about the accounts wake slyly
4|9|2694|51.37|g, regular deposits: quick instructions run across the carefully ironic theodolites-- final dependencies haggle into the dependencies. f
4|1|2480|444.37|requests sleep quickly regular accounts. theodolites detect. carefully final depths w
5|6|3735|255.88|arefully even requests. ironic requests cajole carefully even dolphin
5|8|9653|50.52|y stealthy deposits. furiously final pinto beans wake furiou
5|10|1329|219.83|iously regular deposits wake deposits. pending pinto beans promise ironic dependencies. even, regular pinto beans integrate
5|2|6925|537.98|sits. quickly fluffy packages wake quickly beyond the blithely regular requests. pending requests cajole among the final pinto beans. carefully busy theodolites affix quickly stealthily
6|7|8851|130.72|usly final packages. slyly ironic accounts poach across the even, sly requests. carefully pending request
6|9|1627|424.25| quick packages. ironic deposits print. furiously silent platelets across the carefully final requests are slyly along the furiously even instructi
6|1|3336|642.13|final instructions. courts wake packages. blithely unusual realms along the multipliers nag
6|3|6451|175.32| accounts alongside of the slyly even accounts wake carefully final instructions-- ruthless platelets wake carefully ideas. even deposits are quickly final,
7|8|7454|763.98|y express tithes haggle furiously even foxes. furiously ironic deposits sleep toward the furiously unusual
7|10|2770|149.66|hould have to nag after the blithely final asymptotes. fluffily spe
7|2|3377|68.77|usly against the daring asymptotes. slyly regular platelets sleep quickly blithely regular deposits. boldly regular deposits wake blithely ironic accounts
7|4|9460|299.58|. furiously final ideas hinder slyly among the ironic, final packages. blithely ironic dependencies cajole pending requests: blithely even packa
8|9|6834|249.63|lly ironic accounts solve express, unusual theodolites. special packages use quickly. quickly fin
8|1|396|957.34|r accounts. furiously pending dolphins use even, regular platelets. final
8|3|9845|220.62|s against the fluffily special packages snooze slyly slyly regular p
8|5|8126|916.91|final accounts around the blithely special asymptotes wake carefully beyond the bold dugouts. regular ideas haggle furiously after
9|10|7054|84.20|ts boost. evenly regular packages haggle after the quickly careful accounts.
9|2|7542|811.84|ate after the final pinto beans. express requests cajole express packages. carefully bold ideas haggle furiously. blithely express accounts eat carefully among the evenly busy accounts. carefully un
9|4|9583|381.31|d foxes. final, even braids sleep slyly slyly regular ideas. unusual ideas above
9|6|3063|291.84| the blithely ironic instructions. blithely express theodolites nag furiously. carefully bold requests shall have to use slyly pending requests. carefully regular instr
10|1|2952|996.12| bold foxes wake quickly even, final asymptotes. blithely even depe
10|3|3335|673.27|s theodolites haggle according to the fluffily unusual instructions. silent realms nag carefully ironic theodolites. furiously unusual instructions would detect fu
10|5|5691|164.00|r, silent instructions sleep slyly regular pinto beans. furiously unusual gifts use. silently ironic theodolites cajole final deposits! express dugouts are furiously. packages sleep
10|7|841|374.02|refully above the ironic packages. quickly regular packages haggle foxes. blithely ironic deposits a
11|2|4540|709.87|thely across the blithely unusual requests. slyly regular instructions wake slyly ironic theodolites. requests haggle blithely above the blithely brave p
11|5|4729|894.90|ters wake. sometimes bold packages cajole sometimes blithely final instructions. carefully ironic foxes after the furiously unusual foxes cajole carefully acr
11|8|3708|818.74|inal accounts nag quickly slyly special frays; bold, final theodolites play slyly after the furiously pending packages. f
11|1|3213|471.98|nusual, regular requests use carefully. slyly final packages haggle quickly. slyly express packages impress blithely across the blithely regular ideas. regular depe
12|3|3610|659.73|jole bold theodolites. final packages haggle! carefully regular deposits play furiously among the special ideas. quickly ironic packages detect quickly carefully final
12|6|7606|332.81|luffily regular courts engage carefully special realms. regular accounts across the blithely special pinto beans use carefully at the silent request
12|9|824|337.06|es are unusual deposits. fluffily even deposits across the blithely final theodolites doubt across the unusual accounts. regular,
12|2|5454|901.70|s across the carefully regular courts haggle fluffily among the even theodolites. blithely final platelets x-ray even ideas. fluffily express pinto beans sleep slyly. carefully even a
13|4|612|169.44|s. furiously even asymptotes use slyly blithely express foxes. pending courts integrate blithely among the ironic requests! blithely pending deposits integrate slyly furiously final packa
13|7|7268|862.70|s sleep slyly packages. final theodolites to the express packages haggle quic
13|10|864|38.64|s after the slyly pending instructions haggle even, express requests. permanently regular pinto beans are. slyly pending req
13|3|9736|327.18|tect after the express instructions. furiously silent ideas sleep blithely special ideas. attainments sleep furiously. carefully bold requests ab
14|5|5278|650.07|e quickly among the furiously ironic accounts. special, final sheaves against the
14|8|5334|889.50|ss dependencies are furiously silent excuses. blithely ironic pinto beans affix quickly according to the slyly ironic asymptotes. final packag
14|1|3676|893.39|sits are according to the fluffily silent asymptotes. final ideas are slyly above the regular instructions. furiousl
14|4|4947|310.13| final deposits boost slyly regular packages; carefully pending theodolites
15|6|7047|835.70|blithely quick requests sleep carefully fluffily regular pinto beans. ironic pinto beans around the slyly regular foxe
15|9|3336|784.55|slyly. fluffily bold accounts cajole furiously. furiously regular dependencies wak
15|2|3316|265.89|e express instructions. ironic requests haggle fluffily along the carefully even packages. furiously final acco
15|5|5255|458.67|refully bold instructions among the silent grouches must boost against the express deposits:
16|7|5282|709.16|lithely ironic theodolites should have to are furiously--
16|10|9412|887.53|ly special accounts wake. fluffily bold ideas believe blith
16|3|854|781.91| unusual excuses. requests after the carefully regular pinto
16|6|1491|918.51|unts cajole furiously across the fluffily pending instructions. slyly special accounts could have to boost b
17|8|8555|995.35|are furiously final accounts. carefully unusual accounts snooze across the requests. carefully special dolphins
17|1|7737|648.75|e blithely express accounts. foxes kindle slyly unusual dinos. quickly special f
17|4|3123|555.04|ly bold accounts. regular packages use silently. quickly unusual sentiments around the quickly ironic theodolites haggle furiously pending requests. care
17|7|3203|64.40|bold packages nag fluffily after the regular accounts. furiously ironic asymptotes sleep quickly enticing pinto beans. carefully pending accounts use about the
18|9|1125|664.17|. ironic, regular accounts across the furiously express
18|2|8132|52.44| final packages wake quickly across the blithely ironic instructions. regular pains integrate slyly across the deposits. carefully regular pinto beans among the close
18|5|3133|568.61|riously bold accounts. packages boost daringly. blithely regular requests cajole. regular foxes wake carefully final accounts. blithely unusual excuses det
18|8|6475|386.29|. furiously regular accounts cajole slyly across the pending
19|10|1416|144.80|o beans. even packages nag boldly according to the bold, special deposits. ironic packages after the pinto beans nag above the quickly ironic requests. bl
19|3|5467|405.70|nstructions use furiously. fluffily regular excuses wake. slyly special grouches are carefully regular Tiresias. regular requests use about the quickly furio
19|6|8800|635.66|sual requests sleep carefully. deposits cajole carefully over the regular, regular requests. quickly unusual asymptotes use some
19|9|1340|346.92| requests. final, pending realms use carefully; slyly dogged foxes impress fluffily above the blithely regular deposits. ironic, regular courts wake carefully. bold requests impress
20|1|2927|675.54|s, ironic deposits haggle across the quickly bold asymptotes. express, ironic pinto beans wake carefully enticingly special foxes. requests are at the c
20|4|2723|305.84|nal, bold frets cajole slyly regular, unusual platelets. slyly permanent deposits wake carefully carefully silent accounts. even, even requests wake quickly. furiously pending packages are
20|7|5905|546.66|ing deposits use furiously. ironically final pinto bea
20|10|4271|115.89|xcuses wake at the deposits. regular pinto beans nag slyly fluffi
21|2|6571|944.44|ing instructions impress bold foxes. ironic pinto beans use. thinly even asymptotes cajole ironic packages. quickly ironic pinto beans detect slyly regular deposits. ruthlessly even deposits are. sl
21|6|1704|139.05|posits cajole; quickly even requests sleep furiously. ironic theodolites sleep pending, express instructions. stealthily even platelets cajole carefully after the final, ironic p
21|10|7153|664.50|blithely enticing instructions use alongside of the carefully thin deposits. blithely bold requests are fluffily
21|4|367|584.86|ong the even theodolites. pending, pending accounts sleep-- courts boost quickly at the accounts. quickly fin
22|3|4410|786.18|even accounts. final excuses try to sleep regular, even packages. carefully express dolphins cajole; furiously special pinto bea
22|7|9779|635.84|l instructions cajole across the blithely special deposits. blithely pending accounts use thinly slyly final requests. instructions haggle. pinto beans sleep along the slyly pen
22|1|7834|359.16|sits wake fluffily carefully stealthy accounts. furiously ironic requests x-ray fluffily alongside of the pending asymptotes. slyly silent packages use along the instructions. fu
22|5|1434|597.21|ix across the blithely express packages. carefully regular pinto beans boost across the special, pending d
23|4|2739|460.12|platelets against the furiously bold Tiresias dazzle quickly into the special, bold courts. silent, regular instructions wake blithely ironic multipliers. ideas
23|8|5739|103.13| theodolites need to nag blithely final notornis. slyly idle packages cajole after the furiously stealthy packages. slyly regular accounts use furiously. carefully final accounts affix
23|2|9898|233.94|l, express packages wake permanently. quickly even deposits sleep quickly slyly silent id
23|6|7035|51.75|xcuses; decoys wake after the pending packages. final instructions are furi
24|5|5180|905.41|heodolites above the ironic requests poach fluffily carefully unusual pinto beans. even packages acc
24|9|2227|511.20|, silent packages boost around the instructions. special requests sleep slyly against the slyly regular deposits. final, final accounts haggle fluffily among the final requests. regular
24|3|7182|582.03| the final, ironic asymptotes. regular requests nag instead of the carefully unusual asymptotes. furiously pending attainments among the slyly final packages boost after th
24|7|5318|62.15| careful requests cajole blithely realms. special asymptotes sleep. pinto beans sleep carefully furiously ironic packages. furiously
25|6|9029|832.74|fully fluffily regular frets. sometimes even requests after the requests wake slyly at the quickly ruthless requests. a
25|10|9062|928.96|he foxes. final, final accounts sleep. boldly ironic excuses thrash quick
25|4|9946|694.35|ld, ironic requests. furiously special packages cajole furiously enticing instructions.
25|8|7340|746.59|dly final packages haggle blithely according to the pending packages. slyly regula
26|7|5020|683.96|es. fluffily express deposits kindle slyly accounts. slyly ironic requests wake blithely bold ideas
26|1|6577|892.20|riously pending pinto beans. furiously express instructions detect slyly according to the b
26|5|3499|382.11|imes even pinto beans among the busily ironic accounts doubt blithely quickly final courts. furiously fluffy packages despite the carefully even plate
26|9|9702|821.89| behind the blithely regular courts impress after the silent sheaves. bravely final ideas haggle
27|8|2111|444.01|the even, ironic deposits. theodolites along the ironic, final dolphins cajole slyly quickly bold asymptotes. furiously regular theodolites integrate furiously furiously bold requests. carefully
27|2|9080|157.03|ole express, final requests. carefully regular packages lose about the regular pinto beans. blithely re
27|6|3407|151.34|ironic theodolites are by the furiously bold ideas. ironic requests shall have to sublate final packages. furiously quick foxes alongside of the express, special deposits was boldly according
27|10|4283|348.61|ound the final foxes detect furiously across the even warhorses. quickly t
28|9|6643|204.86|y ironic deposits above the slyly final deposits sleep furiously above the final deposits. quickly even i
28|3|2452|744.57|ully regular theodolites haggle about the blithely pending packages. carefully ironic sentiments use quickly around the blithely silent requests. slyly ironic frays bo
28|7|302|690.30|uickly unusual requests alongside of the final courts integrate slyly
28|1|9988|666.53|beans haggle carefully around the slyly ironic acco
29|10|3506|799.27|leep fluffily according to the quietly regular requests: accounts integrate carefully bold foxes. carefully silent
29|4|8106|981.33|the ironic, bold asymptotes! blithely regular packages hang furiously above the dependencies. blithely permanent dependencies are furiously furiously ironic acco
29|8|9193|734.44|ly unusual packages. foxes cajole. theodolites nag
29|2|6252|186.21|thely carefully even packages. even, final packages cajole after the quickly bold accounts. fluffily quick accounts in place of the theodolites doze slyly f
30|1|4767|989.05|ts. slyly final pinto beans cajole ironic accounts. blithely final accounts use among the request
30|5|535|743.26|sual instructions wake carefully blithely even hockey playe
30|9|7756|568.86| special foxes across the dependencies cajole quickly against the slyly express packages! furiously unusual pinto beans boost blithely ironic Tir
30|3|7945|583.84| sleep. bold, regular deposits hang doggedly furiously bold requests. slyly bold excuses detect busily above the even gifts. blithely express courts are carefully. blithely final packages until th
31|2|9685|620.84|he blithely regular ideas. blithely unusual requests haggle fluffily. platelets
31|7|1951|120.99|refully regular pinto beans. ironic requests integrate furiously since the quickly ruthless platelets. quickly ironic attainments ha
31|5|1402|761.64|r platelets nag blithely regular deposits. ironic, bold requests
31|6|137|849.11|blithely ironic accounts. slyly ironic asymptotes sleep ironic, even accounts. regular accounts thrash quickly
32|2|2203|406.03|es? slyly enticing dugouts haggle carefully. regular packages alongside of the asymptotes are carefull
32|8|467|109.34|ainst the unusual braids nod fluffily packages. regular packages nod among the slyly express
32|3|7975|747.14|final foxes boost furiously pending packages. quickly regular depths promise blithely accoun
32|9|7938|856.09|s integrate according to the even dependencies. carefully regular reque
33|4|4028|891.46|, pending requests affix slyly. slyly ironic deposits wake accounts. express accounts sleep slowly. ironic, express accounts run carefully fluffily final dependencies. furiously unusual ideas
33|9|4410|929.05| packages sleep carefully. slyly final instructions boost. slyly even requests among the carefully pending platelets wake along the final accounts. quickly expre
33|5|1287|310.76|dolites above the slyly express deposits try to haggle blithely special gifts. blithely ironic reque
33|10|6006|327.19|ly. ironic dependencies haggle carefully silent instructions. furiously ironic dolphins are fluffily furiously even theo
34|5|9934|848.75|ven instructions besides the gifts are furiously among the slyly regular packages! instructions use carefully. even requests sleep quickl
34|1|4749|265.31|ckly regular theodolites eat above the bravely regular courts. ironic requests wake slyly.
34|6|5459|824.69|ong the slyly silent requests. express, even requests haggle slyly
34|10|5884|609.69|ully final tithes. slyly ironic deposits hang furiously about the regular, regular deposits
35|6|2500|451.58|nic packages boost carefully carefully even theodolites. blithely fina
35|1|8875|537.72|ully regular deposits: special accounts use. slyly final deposits wake slyly unusual, special ideas. asymptotes
35|9|596|669.19|slyly against the daring, pending accounts. fluffily special pinto beans integrate slyly after the carefully unusual packages. slyly bold accounts besides
35|2|2025|411.17|s cajole fluffily final deposits. furiously express packages after the blithely special realms boost evenly even requests. slow requests use above the unusual accoun
36|7|3907|630.91|al deposits detect fluffily fluffily unusual sauternes. carefully regular requests against the car
36|2|174|434.47|permanently express instructions. unusual accounts nag toward the accou
36|10|2625|569.91|ctions. pending requests are fluffily across the furiously regular notornis. unusu
36|4|8209|289.15|arefully regular requests cajole. special, express foxes sleep slowly. quickly unusual in
37|8|7171|824.96|usly into the slyly final requests. ironic accounts are furiously furiously ironic i
37|3|5542|126.59|ven deposits. ironic foxes cajole. slyly final deposits are furiously after the furiously even packages. slyly ironic platelets toward the slyl
37|5|7113|15.72|re bravely along the furiously express requests. blithely special asymptotes are quickly. fluffily regular packages alo
37|6|1449|745.64|y after the ironic accounts. blithely final instructions affix blithely. bold packages sleep carefully regular instructions. regular packages affix carefully. stealthy fo
38|9|1226|570.11| slyly even pinto beans. blithely special requests nag slyly about the ironic packages.
38|4|4237|662.75|lar warhorses cajole evenly against the attainments. requests cajole furiously furiously express requests. carefully regular platelets use fluffily after the silent, unusual ideas: bl
38|6|1135|160.70|express accounts haggle. carefully even pinto beans according to the slyly final foxes nag slyly about the enticingly express dol
38|5|3516|847.09|nal accounts. furiously pending hockey players solve slyly after the furiously final dependencies. deposits are blithely. carefully regular packages unwind busily at the deposits. fluffily
39|10|3633|463.10|kages are slyly above the slyly pending pinto beans. bold, ironic pinto beans sleep against the blithely regular requests. fluffily even pinto beans use. regular theodolites haggle against the quic
39|5|3682|300.43|ng requests are according to the packages. regular packages boost quickly. express Tiresias sleep silently across the even, regular ideas! blithely iro
39|2|5475|532.26| beans cajole carefully carefully express requests. instructions sleep furiously bold deposits. furiously regular depos
39|3|6259|737.86|y. special, even asymptotes cajole carefully ironic accounts. regular, final pinto beans cajole quickly. regular requests use warhorses. special, special accounts hinder boldly across the
40|1|7690|776.13|lets use fluffily carefully final deposits. blithely ironic instructions sublate against the furiously final ideas; slyly bold courts x-ray silent foxes. regular foxes wake blithely. slyl
40|6|1704|565.82|riously furiously silent asymptotes. final deposits cajole blithely ironic requests. furiously special pains into the blithely final instru
40|10|4521|374.71|ptotes haggle. slyly even requests nag fluffily silent packages. blith
40|8|6617|196.64|he slyly unusual epitaphs? ironic deposits at the furiously unusual instructions thrash blithely requests. requests are carefully blithely pending waters.
41|2|9040|488.55|ss the dinos wake along the blithely regular theodolites. foxes cajole quickly ironic, final foxes. blithely ironic packages haggle against
41|8|5946|391.81| slyly slyly regular requests. final deposits sleep fluffily. blithely bold instructions detect carefully. blithely pending requests are furiously ironically final ideas. regul
41|4|1550|916.55| the blithely final ideas. furiously regular asymptotes could cajole furious
41|10|560|37.59|special pinto beans against the unusual accounts cajole slyly final foxes. close, ironic
42|3|2893|716.81|requests nag. furiously brave packages boost at the furiously even waters. slyly pending ideas nag carefully caref
42|9|2927|709.06|g dugouts. carefully careful ideas are fluffily. carefully final pinto beans snooze. ironic deposits wake evenly along
42|5|3500|200.00|against the ironic, ironic forges. slyly final deposits wake blithely. ironic courts sleep furiously ab
42|1|3662|29.46|es sleep slyly among the slyly final requests. bold theodolites use silently against the final foxes. carefully pending requests use furiously. dogged, unusual asymptotes use
43|4|3211|805.78|gular accounts. bold theodolites nag slyly. quickly express excuses use blithely. blithely even ideas boost fluffily! blithely unusual ideas detect bli
43|10|6770|493.19|ing to the quickly even theodolites. quickly bold excuses haggle. sometimes unusua
43|6|9506|493.65|riously! slyly ironic sauternes affix. ironic theodolites sleep furiously about the express packages. slyly ironic deposits are blithely against the regular package
43|2|3232|307.12|counts: express, final platelets use slyly bold ideas. ironic theodolites about the blithely s
44|5|486|164.22| final notornis throughout the unusual pinto beans are about the special accounts. bold packages sleep fluffily above the
44|1|5310|114.37|quests. quickly unusual requests against the carefully final somas detect slyly bold a
44|7|3534|383.01|r the pending pinto beans! requests wake furiously after the special deposits. silent deposits mold quickly along the express, special
44|3|4798|833.15| run. ironic, special dolphins according to the even, ironic deposits haggle carefully alongside of the carefully regular excuses. regular frays haggle carefully ironic dependenc
45|6|1685|919.63|he doggedly final accounts; carefully regular packages cajole idly regular idea
45|2|5202|877.29|ngage blithely after the final requests. bold accounts sleep blithely blithely express dependencies. pinto beans through the carefully regular hockey players wake
45|8|5669|532.70|es play carefully doggedly unusual requests. bold grouches against the furiously ironic dugouts sleep furiously qu
45|4|1872|155.32| ironic, even pinto beans. bold theodolites haggle after the furiously ironic accounts. slyly bold courts
46|7|4171|244.65|lly quiet instructions. furiously express requests among the final ideas cajole carefully bold waters. furiously regular pac
46|3|8518|106.80|e unusual instructions shall have to detect slyly blithely ironic foxes. bold requests impress silent foxes. ironic, quiet realms haggle quickly pending, express pinto be
46|9|7225|14.78|ously about the fluffily pending accounts. fluffily even dugouts are quickly slyly express platelets; quickly bold pearls sleep slyly even instructions. furiously ironic packages poach quic
46|5|1381|985.88|ending platelets are carefully regular accounts. fluffily even accounts against the dependencies nag carefully final,
47|8|6989|292.52|even ideas. blithely final requests boost blithely. final, ironic instruct
47|4|4458|539.47|; finally enticing theodolites cajole enticing, silent warhorses! slyly bold pains c
47|10|2896|74.54|grate final asymptotes. pending requests kindle carefully final frets. ironic deposits above the slyly e
47|6|5873|296.63|after the regular dependencies. final, bold pains sleep quickly pend
48|9|5052|611.16|posits are blithely blithely final foxes. blithely even deposits haggle fluffily express requests. furiously final theodolites use sl
48|5|9451|191.36|ckages cajole never even, special foxes. regular dependencies wake after the blithely ironic instructions. thinly ironic reque
48|1|5564|668.19|al pinto beans. furiously final frays use slyly according to the ironic theodolites. regular ideas cajole furiously after the slyly even deposits.
48|7|1719|606.16|forges lose. packages cajole regular, bold accounts. never ironic accounts may promise about the permanently bold deposits. always express requests cajole fluffily regular c
49|10|9056|35.11| bold deposits? final, bold pinto beans are furiously slyly regular packages. sly
49|6|6646|908.15|ts sleep across the fluffily final deposits. carefully express accounts around the regular, express excuses x-ray inside the ironic theodolites. expre
49|2|5336|713.25|ld accounts. furiously blithe waters use furiously blithely idle dependencies. pending deposits along the permanently re
49|8|597|812.62|n foxes snooze furiously. courts integrate never. carefully unusual requests are carefully. quickly ironic deposits ha
50|1|1832|565.54|liers above the dolphins dazzle across the regular foxes. furiously regular packages haggle furiously blithely ironic grouches. ironic, even accounts haggle pending, furious instruction
50|7|43|690.87|aggle daringly along the close, express deposits. final requests snooze carefully carefully bold deposits. carefully unusual ideas doze furiously after the furious
50|3|6160|301.06|arefully ironic requests use. furiously pending waters play carefully carefully regular platelets. sly requests cajole furiously slyly regular pinto beans. bold packages boost fluffily. furiously i
50|9|2104|107.17|t blithely unusual theodolites. quickly final accounts affix fluffily regular requests. c
51|2|837|310.74|ly dogged, regular dependencies. express, even packages are
51|9|7318|85.03|al foxes. carefully ironic accounts detect carefully-- slyly even accounts use. furiously final platelets shall haggle sometimes after the blithely regu
51|6|138|728.95|requests according to the carefully unusual deposits promise slyly ironic packages. slyly ironic dependencies are accordin
51|3|8062|901.04|le ruthlessly furiously slow requests. fluffily slow depende
52|3|6533|54.92|efully. slyly special deposits haggle along the quick deposits. slyly pending requests use quickly packages. final, final dolphins doubt according to the quickly unusual excuses
52|10|1937|210.44|s. never even asymptotes nag carefully! regularly unusual foxes along the unusual requests haggle accounts. fluffily express pinto
52|7|4084|628.53| deposits wake slyly pending asymptotes. ironic asymptotes haggle. blithely ironic requests are qui
52|4|5524|424.93|cial, ironic packages. even dolphins boost. slyly final deposits integrate. final sheaves along the silent excuses use at the slyly close foxes; bold accounts are finally even packages. ironi
53|4|6443|192.78|carefully ironic accounts. blithely bold deposits detect furiously against the flu
53|1|5319|563.44|ly. fluffily final pearls boost carefully. special sauternes nod furiously even instructions. carefully regular dependencies across the slyly regular deposits
53|8|8200|388.08|fully requests. furiously final accounts cajole express, regular pearls. special deposits wake fluffily express accounts. quic
53|5|6929|224.83|xes. carefully ruthless asymptotes impress slyly. fluffily final deposits sleep against the ideas. slyly final packages wake. pending, express packages sleep quickly.
54|5|2515|686.51|ly along the packages. blithely close pinto beans are blithely alongside of the unusual packages. carefully even platelets boost alongside of the even foxes. ironic de
54|2|7079|798.98|he carefully unusual packages wake according to the ironic dolphins. permanently regular sheaves nag quickly. regular, ironic
54|9|2386|23.78|kly ironic foxes. final instructions hinder doggedly. carefull
54|6|536|259.24| furiously along the fluffily regular requests. carefully unusual accounts use fluffily final platelets. pending deposits integrate furiou
55|6|7874|611.04|ly special packages. furiously even warhorses integrate. silen
55|3|8460|236.27|round the special, bold asymptotes cajole alongside of the instructions. qui
55|10|8278|134.62|gedly silent pinto beans! furiously regular sentiments was furiously across the silent pinto beans. pending warthogs along the slyly
55|7|1289|130.33|ut the blithely final requests. requests nag blithely.
56|7|241|855.39|nto beans. finally regular sauternes are. carefully bold deposits according to the blithely express requests wake carefully ironic excuses? furiously final deposit
56|4|9104|54.79|tructions above the blithely pending foxes cajole blithely furiously even sentiments. special, exp
56|1|1330|52.29|xpress instructions haggle furiously regular deposits. quickly unusual packages sleep furiously final pinto
56|8|5799|926.25|ades grow around the dependencies. carefully special ideas cajole furiously across the blithely express requests. unusual tithes are caref
57|8|2972|123.11| asymptotes use carefully furiously final deposits. quickly regular deposits are furiously slyly ironic requests. blithely even excuses haggle: blithely special ideas
57|5|4721|411.08|instructions. quickly unusual deposits about the furiously special ideas believe among the furiously bold theodolites. unusual, even ideas nag: slow, special theodolites hagg
57|2|3788|211.66|ly according to the ironic requests-- slyly final accounts print carefully depths? pending, unusual accounts solve
57|9|4583|137.68|ts. blithely bold theodolites can boost carefully carefully even instr
58|9|4328|542.52|ven deposits wake requests. quickly bold platelets sleep furiously after the ironic requests. even accounts haggle quickly bold
58|6|4307|448.31|quickly carefully ironic foxes. bold platelets nag furiously regular packages. slyly specia
58|3|4136|512.24|packages cajole slyly quickly pending depths. special, bold realms cajole slyly. slyly ir
58|10|9689|25.09|long the unusual, express asymptotes. ironic ideas boost bold, special deposits? ironic foxes among the fin
59|10|8374|357.22|c decoys. carefully even pinto beans wake slyly alongside of the express accounts. regular grouches haggle.
59|7|4226|80.98|lar packages. regular depths use slyly after the fluffily regular packages; theodolites around the furiously ironic asy
59|4|99|598.55|he special pinto beans. fluffily even accounts cajole. fluffily regular foxes haggle among the
59|1|8184|45.50|ependencies. ironic dependencies wake carefully according to the blithely bold packages. quickly unusual ideas about th
60|1|6642|800.72| blithely. slyly final realms alongside of the excuses use quickly blithely bold foxes. final theodolites are slyly after the slyly regular excuses. never thin foxes about
60|8|5017|314.81| even pinto beans wake carefully. quickly regular deposits hinder along the furiously regular pack
60|5|148|504.10|s use fluffily. furiously regular deposits boost furiously against the even instructions. blithely final platelets wake. carefully pending asymptotes sleep blithely. regular, s
60|2|5792|92.64|s the carefully pending deposits. slyly regular pinto beans against the furiously regular grouches lose carefully around the enticingly final ideas. furiously express packages cajole bold pa
61|2|1540|858.64| could have to use upon the packages. fluffily special packages integrate slyly final theodolites. pending warhorses wake quickly after the blithely final fo
61|10|9170|771.26|ly. pinto beans sleep blithely about the patterns. slyly final accounts wake according to the furiously bold requests. slyly regular packages wake according to the ironic packages. requests acros
61|8|4762|633.74|final theodolites haggle. fluffily express ideas about the silent theodolites cajole ideas; fluffily special instructions are accordin
61|6|7312|153.74|gly final instructions. pending theodolites will wake furiously. slyly bold instructions run. furiously special foxes cajole f
62|3|1780|692.42|s around the even ideas cajole furiously somas. silent asym
62|1|5896|348.82| final accounts. furious deposits wake slyly. idly regular packages haggle blithely pending grouches. ironic accounts boost blithely. carefully express pa
62|9|9127|620.08|totes. unusual requests after the unusual accounts sleep fluffily bold notornis. slowly careful requests use according to the final ideas. pinto beans sleep. foxes are furiously furiously pe
62|7|9542|255.78|lly express requests haggle carefully. idle, pending pinto beans are furiously regular excuses. quickly sly attainments are furiously; even accounts are slyly quickl
63|4|1804|498.84|leep bravely. final accounts nag. forges sleep against the slyly ironic pa
63|2|1998|509.16|yly express theodolites. slyly bold ideas sleep furiously accordi
63|10|6839|274.15| among the carefully ironic accounts. carefully even accounts against the regular, final deposits detec
63|8|6325|463.69|arly express accounts. express, unusual escapades haggle. special packages must wake. express, regular requests sleep furiously ironic packages
64|5|5567|228.61|y even instructions. unusual requests serve slyly. special foxes sleep quickly. fluffily ir
64|3|4542|398.92|. quickly final ideas cajole carefully among the blithely silent requests. sometimes ironic accounts nag furiously against the pending instructions. f
64|1|9110|602.65| ironic accounts are carefully carefully final accounts. slyly ironic packa
64|9|2064|25.77| quickly regular ideas. carefully final requests snooze carefully regular, regular instructions. stealthily final pi
65|6|2918|846.26|inal, even foxes cajole. furiously final dolphins hang quickly ironic foxes. furiously special packages alongside of the bold foxes solve above the carefully final instructio
65|4|1779|393.63|ully after the quickly regular ideas. ironic, final multipliers above the carefully bold deposits breach slyly furiously express deposits. unusual accounts haggle carefully idea
65|2|2054|503.10|e express excuses. ironic, even accounts across the reg
65|10|2188|288.73|lent requests nag quickly. blithely silent platelets haggle ironic accounts. slyly bold instructions boost carefully final accounts. carefully even dependencies must nag blithely; qui
66|7|3077|809.13|nod carefully besides the furiously final theodolites. slyly final requests haggle. furiously silent excuses detect quickly. ironic deposits detect above the furiously final
66|5|1076|785.75|its across the blithely regular theodolites wake furiously among the furiously regular accounts. pains are slyly care
66|3|2568|447.08|ously even accounts boost slyly daring requests. even, regular realms kindle blithely. unusual, ironic ins
66|1|296|797.27|s nag enticingly outside the furiously final foxes. final accounts haggle fluffily accord
67|8|9923|306.37|ly according to the quickly ironic requests. express instructions after the slyly even instructions x-ray blith
67|6|7908|546.75|furiously express dolphins integrate carefully regular notor
67|4|3368|625.62|le slyly regular requests: regular platelets wake quickly across the quickly regular accounts. reg
67|2|5826|397.34|en, ironic deposits affix quickly unusual requests. busily ironic accounts are finally never even sauternes. ironic depos
68|9|3444|31.37|es impress furiously pending packages. always silent instructions above the fluffily bold packages haggle slyly blit
68|7|6762|5.16|lithely. carefully even grouches along the bold deposits might sleep slyly requests. blithel
68|5|8300|80.86|nooze according to the furiously even ideas. blithely regular accounts wake blithely. furiously regular Tiresias cajole regular deposits. regular theodolites eat alongside of the
68|3|5399|683.59|. finally final pinto beans play carefully unusual requests. never pending accounts are. regular, final theodolites wake furiously excuses. special request
69|10|6197|694.24|eep across the packages. regular, final foxes boost fluffily regular pinto beans. packages sleep along the final requests. bold, unusual packages cajo
69|8|8235|846.49|nt fluffily. carefully ironic instructions wake. blithely express foxes cajole slyly. unusual requests sleep quickly. final packages affix slyly according to the spec
69|6|9294|386.96|ar packages. blithely regular dependencies are dolphins. slyly ironic excuses nag quickly pending, regular ideas. furiously special sheaves haggle. close, regular pinto beans about the slyly bold
69|4|7017|344.28|heodolites. unusual, regular requests boost slyly pending deposits. slyly daring instruct
70|1|4536|348.27|ructions. blithely final packages cajole carefully after the express, even requests. furiously final theodolites cajole
70|9|8063|452.80|y regular deposits nag about the carefully regular instructions; furiously express accounts along the final, express instruct
70|7|2990|940.81|s deposits. unusual foxes are carefully according to the carefully even deposits. carefully ironic foxes cajole fluffily against the carefully pending deposits. slyly special depo
70|5|9074|182.58|ions after the fluffily regular foxes wake above the furiously regular requests: slyly regular deposits wake slyly daringly even Tiresias. express, express deposits are. always unusual pa
71|2|508|842.21|es cajole carefully around the furiously pending instructions.
71|1|8329|239.57|ins sleep carefully slyly express accounts! quickly even accounts boost carefully about the carefully regular excuses. dogged, even dolphins against the sometimes ironic packages believe bl
71|10|6768|744.67|ructions. daring requests solve carefully about the furiously pending pinto
71|9|5179|329.13|usly at the packages. blithely regular deposits haggle regular packages. quickly special theodolites at the blithely ironic instructions wake
72|3|9855|497.26|tithes. quickly pending foxes haggle enticingly according to the accounts. accounts detect slyly: final packages wake. fina
72|2|9346|41.04| pending instructions before the even, silent dep
72|1|2654|762.61|nusual packages: blithely bold Tiresias sleep furiously. slyly brave accounts according to the final,
72|10|4526|154.47|use across the never ironic packages. express, regular accounts above the pending, fluffy deposits are carefully across the slyly even pinto be
73|4|9873|947.99|tes use pending packages. final foxes wake final, unusual packages. blithely blithe ideas haggle sometimes slyly express accounts. express instructions nag furiously quickly
73|3|7729|920.66|ecial accounts sleep according to the slyly sly accounts. slyly express instructions nag. accounts cajole furiously quickly even foxes. furiously regular requests wake. carefully even frets haggle
73|2|5327|108.96| beans are furiously between the regular ideas! unusual pinto beans use. furiously silent requests against the carefully even somas wake care
73|1|3928|309.57|longside of the blithely final ideas. carefully ironic courts sleep along the enticingly pending requests. fluffily regular accounts use fluffily bold ideas. slyly ironic packa
74|5|3128|345.92|ic theodolites. express deposits haggle blithely pending packages. quickly express foxes could are slyly. deposits sleep deposits. final dependencies sleep ab
74|4|2479|930.97|o beans sleep dependencies. regular accounts use blithely asymptotes. u
74|3|9473|496.36| haggle carefully alongside of the regular requests. slyly regular accounts belie
74|2|6234|849.66| slyly regular foxes. silent accounts integrate. even deposits are quick
75|6|7086|624.39|sits are furiously fluffily even courts. furiously pending requests are blithely. pending, regular accounts play carefully slyly unusual platelets. blithely final requests against the ru
75|5|6308|759.36|refully ironic dependencies. pinto beans use according to the packages. regular platelets wake around the blithely p
75|4|9080|433.59|sits. permanent packages breach. carefully final waters wake. bold, pending foxes haggle furiously evenly express instructions. even deposits about the final
75|3|5439|884.01|ding excuses snooze special accounts. tithes alongside of the regular dep
76|7|6754|494.83|gular accounts solve. ironic deposits sleep slyly even packages. slyly pending accounts detect slyly express accounts. ironic forges can play furiously carefully express fox
76|6|2009|108.97|n packages. blithely even accounts sleep carefully furiously ironic accounts. carefully express requests
76|5|6371|552.38|ts use against the quickly ironic ideas. quickly even deposits are carefully a
76|4|7986|252.03| packages across the furiously ironic platelets cajole across the regular, ironic accounts. carefully enticing accounts among the blithely regular instructions detect regular pinto be
77|8|552|254.92|e after the carefully pending packages. carefully even dependencies cajole pending
77|7|8170|875.83|xcuses. blithely even foxes use fluffily. blithely even requests use. slyl
77|6|8541|936.13|e slyly express instructions haggle about the sometimes regula
77|5|1713|402.14|the even ideas kindle after the requests. regular theodolites cajole carefully about the blithely final ideas. carefully even dependencies at the flu
78|9|9915|729.94|around the special excuses. furiously even deposits serve boldly according to the platelets. carefully express accounts at the blithely unusual pinto beans sleep furiously against the u
78|8|7246|577.23|regular dependencies cajole doggedly ironic accounts. bold theodolites doze about the accounts. quickly final requests boost slyly final asymptotes. carefully final dolphins ha
78|7|1801|434.34|nts kindle furiously according to the even packages. blithely ironic platelets are slyly silent foxes. final, final packages would sleep. pinto beans a
78|6|9599|382.82| carefully special theodolites cajole among the quickly even asymptotes. foxes wake blithely across the carefully
79|10|4248|765.34|nusual, express asymptotes wake furiously. ironic pinto beans detect above the carefully express theodolites: even, dogged instructions nag. spe
79|9|465|28.33|uriously special frays cajole across the finally ironic pinto beans. ironic accounts sleep blithely. fluffily silent accounts are slyly at the slyly unusual ideas. even deposits nag slyly
79|8|3309|880.23|tect final, thin accounts? furiously ironic accounts boost regular deposits. carefully ironic attainments sleep. furiously special ins
79|7|8627|891.18|r dolphins grow blithely against the slyly ironic packages. deposits about the regular, ironic decoys are slyly around the carefully regular packages. slyly pending excuses sle
80|1|8893|127.65|ld accounts detect carefully. carefully bold courts along the regular deposits could have to affix ca
80|10|2243|775.79|endencies. bold, regular pinto beans wake furiously above
80|9|5385|945.72|cial asymptotes believe after the blithely unusual deposits. furiously silent pinto beans cajole quickly inside the slyly even deposits. regular, f
80|8|4034|797.05|ptotes cajole carefully. express ideas cajole carefully even somas. final pinto beans print fluffily across the
81|1|1605|550.29|es haggle blithely fluffily final requests. furiously regular foxes use. furiously unusual requests outside the furiously regular requests
81|2|5923|220.23|the final, quick accounts are blithely above the s
81|3|2942|409.73|accounts boost. fluffily unusual requests cajole fluffily slyly ironic requests. foxes cajole quick
81|4|58|492.19| instructions boost furiously across the foxes-- final depo
82|1|7793|697.31|he accounts cajole quickly after the even patterns. ironic platelets sublate regular, even asymptotes. quick courts affix according to
82|2|7698|585.86|pinto beans. slyly express excuses haggle. blithely even pinto beans about the quick inst
82|3|8268|604.25|e after the carefully even theodolites. regular, pending accounts boost. quickly final asymptotes haggle slyly. requests use final, bold pinto beans. bold, ruthle
82|4|5532|900.07| slyly? fluffily special dependencies haggle among the slyly special requests. regular, bold packages after the blithely ironic packages are slyly ironic packages. slyly final deposits w
83|1|3010|745.51|l foxes along the bold, regular packages integrate carefully express courts! final excuses sleep carefully ironic
83|2|8200|399.64|y final platelets are carefully carefully special platelets. carefully ironic requests wake blithely alongside of the slyly even accounts. bold, regular requests sleep
83|3|5974|657.22| even packages boost furiously. slyly regular gifts above the accounts are quickly express packages. slyly pending deposits besides the express, even asymptotes haggle after the ironic ins
83|4|3890|24.73|deposits. carefully even dependencies across the dependencies haggl
84|5|5711|233.61|arefully final platelets cajole blithely; quickly final accounts use furiously. furiously reg
84|6|208|469.80|carefully express dolphins nag about the slyly bold requests. slyly even packages wake among the furiously special attainments.
84|7|2909|969.44|silent requests cajole slowly bold ideas. special, special deposits according to the always silent packages are against the furiously silent packages. even, blithe accounts sleep slyly across
84|8|903|707.77|gly regular dependencies boost. slyly even accounts sleep. furiously final hockey players wake carefully with the reg
85|1|2628|608.77|xes wake furiously after the carefully even platelets. blithe theodolites are furi
85|2|118|917.83| against the even deposits. furiously bold ideas along the furious requ
85|3|2074|491.20|encies-- slyly regular requests about the quiet accounts detect quickly at the
85|4|8289|73.81|s cajole slyly along the slyly special accounts. regular, special deposits wake. furiously special foxes boost. blithely even packa
86|7|806|65.98|ackages. blithely pending accounts are slyly furiously pending theodolites. furiously eve
86|8|2773|250.04|ding accounts. slyly special requests will have to affix carefully along the furiously unusual packages. regular theodol
86|9|5546|816.53|s. slyly final requests wake. furious deposits must wake blithely among the blithely ironic instructions. special hockey players try to are bli
86|10|1418|332.65|press theodolites sleep carefully about the blithely unusual requests. quickly final deposits breach slyly
87|1|5679|688.33|t the carefully regular asymptotes. blithely stealthy pinto beans within the furiously expres
87|2|1272|435.42|ronic foxes sleep along the special foxes. final ideas wake quickly about the carefully special theodolites. blithely ironic packages are blithely. regular, regular pint
87|3|9041|617.20|furiously final deposits. furiously special dependencies solve across the regular, special ideas. carefully silent requests haggle furiously after the special, specia
87|4|1892|868.60|arhorses are. unusual requests use blithely furiously final ideas. final requests sleep theodoli
88|9|6116|334.58|ect furiously around the regular deposits. special, final platelets boost furiously. blithely unusu
88|8|395|71.50| the regular accounts-- furiously even accounts use quickly after the regular, regular deposits. furiously e
88|7|9979|81.82|f the regular, regular requests believe fluffily along the final, quiet decoys. furiously even accounts cajole. carefully express requests wake quickly among the ideas. quickly silent
88|6|276|821.43|gular pinto beans. slyly pending excuses breach blithely express accounts. thin deposits sleep slyly around the even accounts; fluffily busy patterns kindle. slyly final deposits along the
89|10|3430|744.87| integrate slyly dolphins. bold, final frets use beside the carefully even accounts. slyly close dependencies sleep quickly carefully final pinto beans. foxes promi
89|1|8599|776.53|ress packages use furiously. furiously regular packages thrash blithely about the slyly pe
89|2|7876|417.61|nstructions: furiously even requests are quietly unusual accounts. regular requests are after the blithely regular deposits. sl
89|3|924|920.02|ickly unusual asymptotes after the slyly unusual accounts are carefully doggedly ironic accounts. even, final accounts use furiousl
90|1|8037|409.38|eas. unusual, pending packages boost quietly final accounts. slyly final packages serve. slyly even instructions sleep carefully. quickly even foxes wake quickly.
90|2|9683|498.43| accounts! fluffily regular deposits x-ray about the unusual, final packages. furiously final deposits alongside of the caref
90|3|7849|666.13|carefully ironic accounts are around the slyly bold asymptotes. carefully regular packages use furiously. ironic platelets affix carefully final accounts-- fluffily final pinto beans across the fina
90|4|7629|50.84|onic requests wake fluffily unusual packages. furiously even frays after the daringly pending requests wake furiously alongside of the bold requests. fluffily ironic ideas nag. ironic,
91|2|7986|528.64|luffily final instructions. furiously unusual foxes haggle
91|3|3257|906.20|ackages cajole slyly. blithely bold deposits cajole. blithely
91|4|483|823.21|n: slyly ironic foxes nag blithely according to the furiously bold foxes. regular, regular accounts a
91|5|1265|703.41| quickly silent deposits use attainments. final requests along the carefully ironic accounts wake blithely about the carefully ironic excuses. furiously bold excuses wake final, final ex
92|3|9337|224.01| requests are slyly along the deposits. fluffy pains alongside of the deposits
92|4|2246|985.03|jole enticingly regular asymptotes. carefully unusual pinto beans nag carefully ironic ideas. quickly un
92|5|3199|91.63|ake carefully: carefully ironic requests sleep careful
92|6|1044|854.89|l instructions are fluffily silently regular accounts. quickly final dolphins w
93|4|3008|615.98|sits promise blithely fluffily special decoys. slyly regular packages along the slyly final deposits wake accord
93|5|5275|376.47|ounts boost fluffily along the thinly regular realms. busily regular a
93|6|3869|868.81|ly among the furiously silent accounts. closely regular pinto beans nag slyly! slyly e
93|7|7188|805.90|y furiously bold pinto beans. express asymptotes was quickly. carefully final accounts affix slyly! platelets according to the ca
94|5|5433|365.56| even excuses wake carefully. quickly unusual requests wake accounts. regularly pending packages are regular
94|6|7784|358.08|ironic packages wake slyly carefully regular accounts. quickly regular warhorses against the blithely ironic packages haggle doggedly sly
94|7|7232|478.94|y regular requests. carefully final asymptotes haggle carefully against the slyly unusual requests: blithely brave grouches are fu
94|8|3261|824.08|quests. enticingly final accounts sleep fluffily. quickly express asymptotes around th
95|6|5186|291.03|ites across the blithely pending theodolites do affix across the unusual, bold Tiresias. bold packages
95|7|6552|456.36|tes; final, final accounts boost blithely ironic pinto beans. blithely ironic deposits cajole above the quickly pending requests? i
95|8|367|987.22| express requests detect furiously. requests cajole carefully
95|9|7379|973.74| above the furiously unusual deposits haggle ironic ideas. express, even packages haggle slyly slyly special asymp
96|7|5739|202.06|re. slyly regular theodolites breach slyly even dinos. fluffily regular asymptotes haggle slyly. fluffily bold courts affix furiously. regular requests
96|8|4942|571.30|e carefully. bold packages sleep against the furiously express requests. express foxes above the dependencies use quickly according to the slyly expres
96|9|9985|672.29|ecial instructions-- blithely silent theodolites play. even, silent accounts sleep. blithely silent requests haggle final, f
96|10|7250|587.08|efully ironic foxes. regular, final pinto beans boost above the express a
97|8|6371|129.77|fluffily unusual accounts. slyly regular theodolites integrate furiou
97|9|2390|458.34| carefully unusual pinto beans; even deposits detect furiously
97|10|2618|239.34|al theodolites are daringly requests. warhorses sleep blithely requests. special accounts cajole slyly deposits. a
97|1|4580|761.41| beans. carefully final deposits alongside of the carefully final requests haggle idly blithely ironic accounts. foxes cajole slyly against the ironic, special packages. furiously brave excuses boo
98|9|9486|908.21|usly final deposits mold furiously above the even deposits. carefully ironic packages across the quickly regular dolphins are slyly according to the slyly even
98|10|8550|657.16| sleep carefully. bravely bold somas may sleep pendin
98|1|3443|139.00|gular pinto beans maintain quickly fluffily regular deposits. express requests sleep. even requests after the regu
98|2|3759|811.55|iously. final, express packages are across the ironic dependencies. slyly thin ideas according to the even Tiresias detect furiou
99|10|8487|438.38|lphins affix ironic packages. blithely ironic requests nag fluffily after the slyly ironic foxes. bold dependencies boost furiously. special,
99|1|7567|496.93|es? permanently even excuses haggle quickly across the dependencies.
99|2|7970|365.83|ending accounts cajole furiously. requests promise care
99|3|2789|843.88|ending accounts. furiously sly packages above the carefully unusual dolphins sleep after the thinly even deposits. requests wake abo
100|1|7885|490.61| accounts nag slyly against the bold excuses. pearls according to the fluffily ironic accounts haggle fluffily along the quickly final platelets
100|2|2070|196.73| dolphins. bold deposits along the even theodolites sleep furiously about the final pinto beans. furiously unusual courts cajole about the carefully bold asymptotes. accounts integrate slyly entic
100|3|4994|929.57| deposits. accounts are slyly regular ideas. slyly special pinto beans upo
100|4|9688|22.00|uctions according to the carefully ironic deposits haggle carefully express ideas? packages across the quickly final requests c
101|2|5589|305.40|blithely above the fluffily pending ideas. quickly quick accounts nod ruthlessly above the carefully pending packages. slyly s
101|4|8263|218.71|fluffily final requests. carefully even packages wake quickly about the quickly ironic foxes. fluffily even requests hang quickly about the pending, final requests. sp
101|6|6324|786.53|olites sleep quickly. slyly ironic theodolites affix. furiously bold accounts integrate among the pinto beans. final ideas hang slyly along the quickly regular packages. instructions cajole.
101|8|55|612.09|beans against the carefully express ideas wake quickly along the quickly unusual requests. blithely regular accounts cajole fluffily. enticingly pending theodolites haggle furiously fluffily pendi
102|3|1384|876.75|s wake quickly. carefully express deposits wake. silent, regular requests sleep slyly after the furiously ironic deposits. slyly unusual accounts cajole
102|5|9137|332.71|telets are final, special deposits. silently ironic deposits wake. pending, eve
102|7|9156|618.00| the unusual, ironic pinto beans. theodolites above the foxes sleep slyly car
102|9|6942|231.02|tions haggle against the furiously ironic deposits. quickly final asymptotes haggle carefully. regular sentiments might cajole silent courts. blithely bold frays
103|4|5913|905.88|e across the theodolites. carefully pending escapades haggle after the ironic theodolites. furiously pending ac
103|6|7742|414.42|bout the bold, regular deposits; blithely even accounts are regular, even platelets-- carefully express accounts nag slyly pen
103|8|5164|361.48|furiously thin deposits haggle blithely. blithely regular deposits above the carefully regular accounts are slyly carefully regular packages. silent, unusual
103|10|429|605.20| theodolites cajole quickly above the asymptotes-- slyly special packages can haggle carefully blithely final instructions. unusual, regular ideas
104|5|2368|946.39|packages. final packages wake enticingly. furiously regular asymptotes are always about the carefully regular deposits. slyly regular platelets cajole carefully. final pinto beans must pro
104|7|6110|15.57|ending requests. carefully regular deposits use blithely. bold, ironic deposits wake slyly carefully specia
104|9|6269|213.89| ideas against the final accounts wake slyly regular notornis. final deposits haggle a
104|1|3369|729.38|ong the foxes. foxes sleep quickly? carefully regular accounts sleep. special foxes boost quickl
105|6|4602|27.75|lar pearls cajole never carefully even depths. blithely regular ideas are quickly. unusual asymptotes nod carefully carefully regula
105|8|269|158.62| unusual courts eat pending excuses. ironic, ironic requests use. bravely
105|10|8855|810.86|. slyly special depths sleep. bold packages engage furiously bold packages. fluff
105|2|8519|904.17|ding to the furiously careful ideas. dogged theodolites wake fluffily among the slyly bold ideas. blithely brave warthogs above the slyly even theodolit
106|7|8649|732.15| slyly ironic instructions are. bold, final accounts cajole slyly ironic pinto beans. fluffily ironic accounts around the quickly special requests use blith
106|9|3144|779.68| final deposits along the slyly express theodolites cajole blithely after the ironic pinto beans. furiousl
106|1|1411|310.40|al accounts impress. even instructions engage furiously final foxes. silently final deposits wake qui
106|3|2297|281.98|inal packages. pending foxes sleep bold hockey players. courts across the blithely regular packages sleep fl
107|8|7249|168.03|he fluffily even packages. slyly regular dependencies nag fluffily above the final, unusual foxes. final, pending foxes affix. furiously final deposits cajole quickly blithely
107|10|4029|91.31|integrate. requests maintain quickly. carefully regular ideas about the instructions sle
107|2|4667|372.94|uctions sleep doggedly final requests. express, final theodolites cajole fluffily furiously silent deposits. blithely regular requests cajole quickly regular instruction
107|4|7912|474.77|fluffily across the final, bold accounts. quickly regular deposits grow carefully deposits. regular requests haggle blithely. slyly special platelets boost furiously care
108|9|4149|558.85| of the quickly pending theodolites. fluffily unusual frays wake accounts. carefully even foxes wake slyly. carefully special pinto beans
108|1|4898|241.47|lthily according to the fluffy deposits. furiously silent ideas according to the furiously special theodolites wake furiously a
108|3|5534|626.89|instructions. blithely regular instructions according to the permanent foxes cajole blithely slyly fluffy foxes. slyly regular asymptotes cajole foxes. slyly unusual deposits
108|5|3142|922.27|slyly express accounts are fluffily along the blithely unusual packages. pinto beans mold furiously. furiously bold instructions are blithely deposits. quickly special accounts detect t
109|10|524|275.19|st the permanently final requests. carefully pending pinto beans haggle quickly slyly ironic dolphins. blithely bold deposits wake blithely. even requests cajole foxes. iro
109|2|4470|992.21|ake furiously packages. blithely even foxes haggle furious
109|4|8176|936.60|d the express accounts. even theodolites wake quickly up the furiously bold foxes. furiously regular packages use regular, bold
109|6|7524|374.49|sual requests. final pinto beans cajole furiously. dependencies integrate slyly even excuses. blithely special requests wake around the slyly final pinto beans. furiously pending requests wake furi
110|1|2782|566.46|ly sly deposits. regular deposits are; theodolites haggle furiously bold foxes. final pinto beans wake blithely furiously ironic depths. unusual, regular platelets cajole. final, ironic
110|3|8914|183.47|yly even foxes. carefully regular requests doubt. pending, regular requests across the blithely final theodolites hag
110|5|1160|932.08|ake blithely. furiously ironic accounts sleep fluffily
110|7|4927|196.63|theodolites. instructions haggle even packages. waters impress furiously quickly express courts. furiously ironic depths nod quickly? ironic, ironic requests sle
111|2|1890|321.97|st foxes. daring depths use above the furiously special ideas. ironic foxes among the carefully final theodolites are alongside of the regular depths. e
111|5|9587|978.65|express instructions against the furiously final grouches haggle across the blithely ironic theodolites. slyly special dependencies in place of the carefully pending
111|8|8069|745.33|thely bold requests. unusual packages sleep. quickly pending ideas nag furiously to the carefully final p
111|1|2175|496.08|s around the daringly final pinto beans use furiously against the pi
112|3|8509|111.42|unts. carefully ironic instructions are final, bold foxes. bold excuses run according to the unusual packages. theodolites cajole carefully according to the fluffily pending deposits? sly
112|6|7652|783.52| carefully among the furiously final packages. regular instructions nag. slyly pending ideas hang fluffily blithely ironic instructions. ironic deposits haggle except the quickl
112|9|4835|913.75|ach slyly special dependencies. furiously ironic pinto beans sleep slyly pen
112|2|1211|815.88|l requests integrate furiously. quickly quiet packages are carefully regular accounts. regular packages eat quickly express, ironic sheaves. quickly dogged accounts o
113|4|9981|396.26|ithely express pains lose bravely fluffily pending foxes. blithely ironic sauternes cajole q
113|7|3804|860.68|ully about the carefully even accounts: thinly even foxes are carefully.
113|10|522|981.41| warthogs use quickly alongside of the furiously unusual requests. final deposits are blithely acro
113|3|4692|141.48| blithely unusual gifts snooze against the quickly ironic packages. regular packages across the carefully regular packages bo
114|5|7146|447.24|ideas will nag regular accounts! carefully final requests cajole furiously quickly final tithes. furiously express instructions a
114|8|3062|555.12|ts. furiously regular requests run carefully thin decoys. ironic platelets sleep alongside of the slyly silent deposits. reg
114|1|4519|382.87|nts. ironically express dolphins dazzle blithely. special instructions wake carefully along the ideas. quickly special dolphins sleep. furiously pendi
114|4|2113|570.79|o beans sleep among the ironic excuses. furiously even sheaves are. never regular instructions nod.
115|6|1817|82.84|uffily final accounts integrate furiously along the carefully busy excuses. slyly even asymptotes doubt quickly. fluffily thin theodoli
115|9|983|867.45|kly. requests nag after the blithely bold packages. express requests cajole theodolites. blithely express requests sleep after the furiously regular accounts. fluffily r
115|2|7781|861.93|lyly ironic pinto beans affix alongside of the furiously even ideas: quickly bold warhorses sle
115|5|3002|81.52|efully after the quickly regular deposits. daringly pending ideas sleep even ideas. silent, re
116|7|6580|705.50|iously. slyly regular requests detect slyly. carefully bold packages sleep furiously carefu
116|10|4975|413.86|tions. regular excuses detect. ideas haggle slyly about the slyly ironic courts. ironic foxes solve. ideas affix fluffily after the special, even dependencies. final platelets according
116|3|8679|866.56|aphs cajole blithely regular accounts. even packages doubt; bold instructions boost quickly. fluffi
116|6|5632|37.30|ccounts about the special packages nag across the carefu
117|8|5906|706.51|into beans sleep carefully blithely bold packages. even, bold instructions use across the carefully e
117|1|1986|322.08|eposits. special pinto beans use fluffily across the furiously regular pinto beans. furiously regular epitaphs nag fluffily packages. special accounts a
117|4|2577|761.86|riously. doggedly unusual ideas boost blithely blithely regula
117|7|4762|552.88| run furiously ironic accounts. slyly ironic deposits haggle slyly fluffy requests. flu
118|9|694|744.73|refully slow requests. requests against the special pac
118|2|6326|325.61| packages. express, final frays affix quickly above the final asymptotes. carefully regular requests doubt quickly f
118|5|7806|283.27| accounts affix carefully. regular, regular packages among the brave, pendin
118|8|4951|976.55|s orbits. even asymptotes above the instructions wake fluffily according to the sly, final excuses. express deposits across the blithely ironic depend
119|10|2307|473.64| blithely unusual dolphins boost busy, express ideas. regular requests use carefully furiously ironic deposits. carefully regular packages would sle
119|3|1452|676.92|ular instructions was slyly. furiously bold gifts boost f
119|6|4955|488.93|ias are along the express requests. fluffily pending ideas nag idly against the fluffily bold instructions? foxes cajole quickly. slyly special deposits haggle slyly e
119|9|583|782.47|yly pending requests-- carefully special instructions haggle carefully even instructions. blithely regular theodolites detect blithely final ideas. blithely ironic deposits among the sl
120|1|4976|201.21|inal, regular pinto beans haggle carefully! ironic ideas unwind among the slyly regular theodolites. regular platelets kindle blith
120|4|7744|365.79|l, special escapades! ideas sleep slyly instructions. carefully bold requests are. even accounts cajole. final accounts use slyly
120|7|5329|249.61|s cajole blithely. carefully bold requests believe blithely? brave accounts above the pending, dog
120|10|3102|566.34|ctions; realms beside the blithely final theodolites unwind blithely packages. regular dolphins sleep carefully-- carefully express accounts wake quickly. pending depths use never courts.
121|2|9741|147.45|ly according to the carefully regular asymptotes. silent excuses cajole carefully against the never silent instructions. furio
121|6|4246|850.42|usly final instructions. theodolites are according to the permanently ironic accounts. carefully pending accounts haggle about the pending instructio
121|10|7670|449.39|carefully daring packages. express packages use carefully about the quickly unusual packages. special ideas along
121|4|8709|655.22| detect carefully along the carefully even pinto beans. gifts haggle: ideas sleep ar
122|3|1019|451.29| blithely regular accounts. blithely final pains sleep besides the blithely final warhorses. furiously unusual requests haggle furiously
122|7|2490|637.28|efully special excuses grow slyly unusual packages. carefully quiet as
122|1|4957|650.84|quests. quickly bold requests nag across the furiously ironic accounts. ironically express instructions detect slyly carefully ironic requests. even, un
122|5|2083|739.25|counts. unusual requests alongside of the regular requests are carefully stealthy instructions? regular sauternes cajole. final theodolites breach carefully at the blithely final idea
123|4|9881|107.03|fully bold deposits detect slyly pending instructions. slyly special ideas detect blithely. slyly fluffy instructions hinder
123|8|5638|818.19|thely even pinto beans. furiously regular asymptotes affix furiously. regular, ironic tithes integrate quickly. blithely regular requests breach finally. decoys alon
123|2|2692|217.01|he ironic accounts nag fluffily after the bold, pending theodolites. blithely final ideas sleep carefully according to the blithely ironic foxes. regular requests are. furiousl
123|6|5311|149.65|eposits cajole according to the carefully pending packages. furiously final epitaphs solve alongside of the even requests
124|5|7102|901.98|ily accounts. furiously busy theodolites above the deposits thrash above the blithely final foxes. express instructions nod slyly furiously busy packages. special asymp
124|9|3969|908.64|l epitaphs. packages cajole among the furiously regular requests. closely
124|3|9295|882.54|s along the accounts poach quickly ironic deposits. even, final excuses thrash carefully about the express, special pains. carefully careful accounts breach slyly
124|7|9416|822.78|ously. theodolites affix around the slyly bold packages. even, ironic packages are carefully pains. furiously unusual requests sleep blith
125|6|2263|358.45|e. ironic, regular requests cajole fluffily along the even ideas. final ideas wake blithely. blithely bold
125|10|8276|668.65|nd the carefully express requests. slyly regular requests haggle. blithely unusual platelets solve fluffily fluffily regular
125|4|2600|455.70|ounts. thinly special accounts cajole carefully. even, special accounts after
125|8|5546|806.66| to the unusual courts are deposits! final, final pinto beans solve slyly. ironic accounts boost fluffily. furiously pending d
126|7|2647|221.89|lyly final pinto beans across the regular, even courts use slyly slyly pending braids! unusual requests along the furious
126|1|2373|194.38|fter the ideas. blithely daring sheaves print furiously among the blithely final packages. iron
126|5|1532|451.61|refully alongside of the quickly bold excuses. enticing, bold
126|9|5458|929.43|leep to the furiously special accounts. furiously final courts
127|8|7658|712.33|al pinto beans! slyly ironic excuses boost after the packages. express foxes integrate carefully. pending, regular theodolites
127|2|1467|237.98|regular accounts! quickly ironic packages haggle according to the accounts. carefully ironic
127|6|8281|3.14|ts above the furiously pending asymptotes cajole after the deposits. slyly ironi
127|10|8894|73.42|fter the sometimes special courts sleep about the slyly unusual reque
128|9|6982|425.29|ironic asymptotes. fluffily ironic packages use. ironic, regular ideas are in place of the quickly silent deposits. final, bold gifts across the ironic, regular pac
128|3|7602|224.49|xcuses. blithely unusual theodolites use slyly carefully even warthogs. slyly even dugouts haggle slyly final, express pinto beans. furiously bold packages thrash requests? slyly unusual packages
128|7|3766|947.16|arefully regular packages boost regularly. accounts are according to the blithely even dependencies. slyly silent accounts doubt slyl
128|1|7023|875.78| furiously quickly regular pinto beans. always special requests are. quickly regular deposits are furiously. slyly unusual theodolites haggle evenly; furiously special deposits wa
129|10|5721|129.69|ully express requests above the ironic, final requests cajole slyly along the quickly special packages. sl
129|4|7242|200.26|es across the furious escapades wake quickly slyly e
129|8|5299|330.59|final sentiments affix atop the silent foxes. busy pinto beans cajole. slyly final pinto beans haggle against the carefully expres
129|2|1968|27.22|ealthy, ironic deposits. slyly ironic pinto beans are blithely pinto beans. blithely ironic
130|1|4928|223.38|ths. slyly even theodolites detect according to the slyly final courts. carefully unusual deposits ar
130|5|6909|275.58|lly unusual accounts try to boost along the special packages. furiously bold requests x-ray blithely ironic waters. slyly unusual orbi
130|9|4850|442.81|ully regular deposits snooze. slyly silent foxes detect furiously furiously bold requests. slyly regular accounts breach. blithely bli
130|3|7387|883.99|aggle furiously. even ideas hinder deposits. even, final ideas are. unusual theodolites after the special, express foxes haggle carefully pending accou
131|2|3263|211.70|sits sleep quickly regular multipliers. slyly even platelets cajole after the furiously ironic deposits. slyly ironic requests should have to cajole: bl
131|7|125|861.84|l accounts grow quickly-- slyly ironic requests haggle? quickly express pinto bean
131|3|5138|572.43|grouches run with the carefully even packages. ironic, even deposits run slyly along the packages. special dependencies among the regular
131|8|8945|613.09| are carefully along the quickly final theodolites. packages after the quickly pending package
132|3|3092|687.29|y special decoys against the ideas affix against the sly
132|8|1904|925.73|the regular foxes wake ironic deposits. ironic, special requests use blithely instructions! final requests hang. blithely regular deposits haggle. ir
132|4|7441|357.06|ests. furiously unusual requests wake furiously. quickly unusual depos
132|9|5303|353.06|ep blithely after the sly accounts. slyly express dolphins cajole amon
133|4|5727|49.17|boost blithely across the ironic, regular instructions. packages use slyly unusual requests. bold accounts above the fu
133|9|404|478.18|ly ironic requests run instead of the blithely ironic accounts? regular ideas use fluffily: even, express packages sleep abov
133|5|4568|57.48|dolites. ironic accounts are blithely pinto beans. regular pinto beans haggle beneath
133|10|2813|277.26|s. pending, final accounts haggle blithely furiously pending deposits! carefully unusual attainments integrate. blithely bo
134|5|8879|848.14|lites. slyly final foxes after the bold requests cajole carefu
134|10|9013|102.99|pendencies. furiously express warthogs cajole furiously ironic, regular asymptotes. bold deposits boost among the furiously even theodolites. regular instructions integrate carefully
134|4|852|927.45| sleep unusual, express packages. unusual sentiments are furio
134|9|6270|388.28| to the furiously pending deposits nag along the slyly express asymptotes. slyly silent accounts shal
135|6|6940|465.82|ding foxes cajole. even dugouts haggle busily. fluffily pending packages about the express excuses boost slyly final packages. blithely express ideas cajole about the carefu
135|1|2443|9.83|atterns. pending, special deposits are furiously. express, regular deposits integrate quickly. unusual gifts cajole blithely stealthily pending deposit
135|7|7453|698.42|ven accounts. slyly final instructions nag slyly around the regular, unusual packages. slyly sp
135|2|2771|306.43|old deposits. furiously express instructions boost. pending dolphins use requests. slyly regular packages cajole quickly final ideas. pending, regular ideas nag carefully even, express pla
136|8|2237|548.19|ond the silent accounts haggle above the blithely regular packages
136|3|6068|806.19|structions. ironic theodolites haggle according to the final, daring pearls. carefully ironic somas are silently requests. express pa
136|7|8979|387.57|ans. express pinto beans wake carefully among the slyly ironic foxes: carefully final pinto beans haggle blithely. pending, final deposits promise furiously
136|2|9617|525.81| across the carefully pending warthogs. close, regular packages are quickly after the never ironic foxes. accounts sleep quickly along the furiously regular re
137|8|9057|302.26|slyly about the regular instructions. even, ironic theodolites use carefully around the even decoys. unusual, pending dolphin
137|3|4078|441.11|packages. blithely unusual sentiments should are. furiously regular accounts nag quickly carefully special asymptotes! idly ironic requests dazzle bold requests. carefully expres
137|9|467|371.85|ly special accounts detect carefully. furiously ironic deposits nag express packages. slyly quiet
137|1|7850|187.31|atelets sublate fluffily. enticingly unusual packages boost according to the blithely ironic foxes. pending requests mold sly
138|9|133|576.96|regular, final deposits maintain slyly even requests. regularly furious deposits use above the stealthy requests. ironic deposits are. carefully final frays are carefully. carefu
138|4|2535|885.35|lar deposits. courts sleep carefully. furiously express ideas boost furiously after the final, regular foxes. furiously bold deposits are. express accounts haggle blithely.
138|10|7907|119.83|epitaphs? quickly express foxes use pending accounts. special packages cajole blithely among the quickly unusual accounts? boldly ironic packages across the slyly ironic senti
138|5|967|309.03|pendencies integrate against the unusual pains. carefully unusual theodolites wake quickly across the deposits. blithely regular deposits alongside of the carefully regular deposits
139|1|2886|285.75|fully ironic requests according to the quickly final idea
139|5|9255|684.61|ickly furiously regular excuses. boldly express deposits sleep. ideas nag above the silent dependencies. slyly regular packages wake furiously. requests are carefully. quickly final fox
139|10|1042|972.23|gular, regular theodolites. regular asymptotes haggle carefully according to the permanently even deposits. slyly special account
139|6|3285|690.00|xpress pains. quickly regular ideas after the special, bold excuses wake furiously final ideas. slyly bold accounts nag packages. ironically regular
140|1|2379|501.05|of the silent, bold courts. slyly regular dependencies haggle. fluffily special deposits cajole carefully. quickly ironic depos
140|7|3533|781.45|ayers. carefully ironic pinto beans nod carefully furiously regular pinto beans. slyly ironic requests after the carefully regular packages are about the blithel
140|2|304|45.84|ing requests. carefully unusual foxes are final requests. slyly regular accounts wake permanently. quickly ironic theodolites hagg
140|8|7346|429.52| special pinto beans wake carefully unusual warthogs! furi
141|2|6776|293.63|fluffily unusual courts sleep. close pinto beans haggle quickly after the carefully ir
141|8|1660|139.18|egular accounts. enticingly bold theodolites eat slyly across the never ironic platelets. theodolites wake bli
141|4|7628|838.08|sly about the pinto beans. blithely ironic ideas sleep. foxes are quietly among the pinto beans. carefu
141|10|90|810.68|e doggedly regular ideas. foxes haggle slyly. slyly regular theodolites across the carefu
142|3|9219|897.49|thlessly special requests sleep blithely about the bold deposits. express, ironic instructions wake. final packages are blithely. deposits are carefully furiously even deposits. furiously regular a
142|9|13|334.33|are blithely blithely brave requests. slyly regular theodolites are furiously. blithely ironic dependencies haggle blithely. furiously unu
142|5|3076|860.55|gular requests about the pending packages wake furiously dogged accounts. th
142|1|3858|854.08|efully special deposits. blithely bold pinto beans haggle. slyly final ideas boost blithely. finally special requests mold along the blithely express packages. entic
143|4|7326|960.64|the slyly pending requests cajole quickly blithely regular platelets. even requests boost carefully. ironic, final instructions above the regular courts boost a
143|10|3923|741.01|le quickly furiously silent ideas. carefully regular requests ar
143|6|7152|772.24|fully furious accounts. final asymptotes cajole regular requests. carefully regular courts are quickly. slyly ironic ideas above the carefully regular requests wake
143|2|1952|199.37|l accounts are quickly after the unusual packages. regular accounts wake among the quickly even accounts. even, ironic
144|5|6295|457.37| pinto beans promise across the blithely bold packages. express, regular accounts play around the slyly silent deposits. specia
144|1|494|849.96|uriously ironic pearls wake idly furiously even pearls. foxes impress slyly busily express requests. carefully slow somas wake quick
144|7|1799|713.88|yly final requests. packages are. carefully daring accou
144|3|5427|361.83| foxes integrate carefully. deposits cajole fluffily. pending deposits kindle slyly carefully regular packages. even, thin accounts according to th
145|6|11|641.67| slyly regular packages are slyly carefully special dolphins. unusual braids use furiously about the final courts. slyly special
145|2|3838|568.91|ss, final asymptotes are. furiously express accounts run. furiously express dependencies eat carefully blithely ironic theodolites. closely ironic foxes among the silent asymptotes cajole
145|8|1344|422.60| dependencies. even patterns detect slyly after the ironic deposits. ironically even ideas wake slyly. even packages against the blithely express accounts haggle furiously carefully regular
145|4|4332|894.57|are carefully above the quickly silent deposits. evenly bold reque
146|7|2726|231.15|uriously after the fluffy accounts. furiously bold deposits cajole. requests might engage. quick accounts wake carefu
146|3|4628|123.91|ly across the dependencies. daringly ironic deposits are furiously; requests are. quickly regular accounts hang. carefu
146|9|5893|858.59|sual instructions believe. fluffily unusual warhorses nag. unusual dependencies sleep. slow sheaves haggle furiously. carefully ironic dependencies cajole slyly against the accounts.
146|5|9687|882.37|packages? ideas affix slyly even accounts: express requests wake slyly carefully special depths. ironic in
147|8|7442|939.14|sts against the furiously unusual instructions integrate ironic accounts. slyly final pinto beans sleep blithely carefully final asymptotes. slyly ironic warhorses befor
147|4|7647|102.19|refully regular orbits about the furiously express asymptotes haggle carefully according to the blithely regular ideas. blithely express excuses around the furiously
147|10|1596|466.37|ole. slyly final packages do haggle quickly. unusual accounts across the pending pinto beans was furiously according to the furiously brave deposits. pending deposits along the regular request
147|6|4235|235.91|ar pinto beans. regular instructions sleep carefully after the furiously blithe accounts. slowly pending ideas could nag careful, even accounts. attainments use slyly quickly
148|9|8007|177.40|final requests-- slyly regular theodolites haggle carefully across the blithely final dependencies. slyly even requests about the carefully even accounts sleep
148|5|1904|774.56|y even pinto beans. fluffily ironic packages sleep slyly. permanently brave requests boost furiously packages. boldly ironic deposits across the carefully bold pinto b
148|1|5393|264.09|ses. slyly pending packages haggle fluffily fluffily even instructions. fluffily regular packages are carefully about the furiously even asymptot
148|7|2957|250.98|. requests boost above the bold, special foxes. blithely regular platelets serve blithely slyly final ideas. carefully special idea
149|10|959|679.10|y to sleep carefully ironic requests. even, regular dependencies haggle. slyly unusual foxes haggle along the instructions. quickly even accounts nag furiously special accoun
149|6|7283|201.03|usly bold instructions. regular, final deposits alongside of the furiously ironic platelets are slyly even instructions. carefully bold accounts are. ironic, regular requests nag furious
149|2|7392|266.53|es detect along the regular instructions. bold ideas boost slyly. quickly unusual accounts doubt. carefully even foxes thrash slyly silent, ironic dolphins: Tiresias must wake
149|8|4104|312.37|ly express excuses. bold pinto beans boost blithely across the bold, final pinto beans. final deposits haggle carefully from the
150|1|8091|524.71|sleep furiously furiously bold warthogs. furiously express gifts according to the regularly silent sentiments boost within the f
150|7|2721|814.79|dependencies. special accounts wake carefully furiously regular accounts. regular accounts haggle along the express instructions. express pinto beans along the express, bold deposits run
150|3|3172|33.71| about the silent ideas. fluffily final requests impress. slyly final requests wake carefully about the slyly express foxes. slyly regular warthogs sleep fur
150|9|1640|327.34|slyly even deposits alongside of the furiously even accounts detect boldly quickly regular accounts. final accounts kindle carefu
151|2|391|281.90|dolites. boldly ironic packages cajole fluffily regular instructions. regular, ironic accounts are blithely. ironic accounts are alongside of th
151|9|253|840.06| haggle. somas are carefully. slyly regular requests sleep blithely atop the thinly express deposits. stealthily express packages cajole daringly express requests. carefully special requests after t
151|6|1484|71.68|riously final requests sleep according to the regular deposits? slyly ironic ideas wake furiously. quickly even theodolites use fluffily. regular, unusual courts according to the regular
151|3|9417|244.06| foxes along the hockey players are slyly about the blithely even packages. unusu
152|3|1396|164.60|d the instructions. carefully pending accounts haggle fluffily ruthless instruc
152|10|2653|432.12|carefully pending requests. quickly ironic requests haggle carefully special theodolites. blithely special requests aga
152|7|3599|77.38| quick excuses according to the pending, ironic requests snooze carefully slyly even foxes: slyly regular instru
152|4|1283|142.73|olites above the furiously even requests dazzle blithely against the busy, regular pains. furiously blit
153|4|4695|539.86|atelets. dolphins haggle blithely carefully ironic deposits? express, final accounts wake about the requests. even deposits should use quickly. regular,
153|1|8464|680.14|cording to the final instructions. carefully fluffy asymptotes haggle carefully
153|8|2916|685.52|ully express deposits boost daringly packages. furiously ironic accounts sleep slyly ironic instructions. special deposits integrate blithely.
153|5|6397|285.92|furiously special platelets haggle quickly even, bold pinto beans. blithely close pinto beans boost around the furiously regular packages. quickly express requests cajole.
154|5|3961|474.19|quickly pending requests nag express dependencies. furiously unusual requests about the regular, pending packages wake according to the ironic packages! theodolites wake about the unusual, regula
154|2|3231|829.29|ins along the packages use carefully requests. furiously unusual packages kindle fluffily quick
154|9|7315|960.19|uickly regular dolphins ought to believe among the q
154|6|1682|160.31|refully except the sly, even requests. careful ideas haggle after the slyly regular foxes: slyly special packages at the slyly regular deposits wake carefully theod
155|6|2893|222.02|. bold packages are toward the silent pinto beans. quickly fin
155|3|7077|413.24|lar instructions against the furiously unusual instructions breach furiously for the bold, even platelets. ironic accounts must have to are quickly across the
155|10|3029|413.02|the carefully ironic asymptotes. even, unusual accounts sleep furiously about the blithely regular ideas. quickly re
155|7|977|751.45|quickly silent deposits doubt above the unusual instructions. special r
156|7|4755|453.69|e of the excuses. slyly even theodolites boost about the slyly final foxes? requests after the carefully regular platelets sleep above the furiously pending d
156|4|7228|994.19|odolites wake quickly slyly final dinos. requests cajole slyly along the instructions. furiously regular deposits cajole slyly blithely ironic instructions. instructions wake. blithely even pinto be
156|1|3043|252.66|lithely express, silent decoys. bold, special requests along the carefully even accounts
156|8|3191|9.87|ar instructions-- quickly special deposits wake fluffily about the blithely e
157|8|5414|369.44|ong the carefully bold ideas boost across the regular, ironic requests. ironic fo
157|5|763|568.46|cial packages boost along the ideas. packages sleep slyly express packages. ironic, bold requests
157|2|3718|901.53|, ironic foxes. blithely even foxes wake about the carefully special req
157|9|3400|288.41|encies integrate carefully even accounts. regular, regular sentiments are against the slyly regular deposits-- even, even ideas use inside the carefull
158|9|2845|408.72|y. slyly final pinto beans believe fluffily pending, regular deposits. final, unusual ideas according to t
158|6|8715|452.31|instructions along the ironic, final requests are fluffily regular deposits. regular deposits cajole carefully about the silent instructions
158|3|4465|837.16| wake carefully in place of the furiously express deposits. slyly regular instructions engage. fluffily f
158|10|4251|431.90|etly special accounts boost carefully final multipliers. carefu
159|10|9200|356.66|ccording to the furiously final accounts. carefully fluffy foxes wake idly against the quickly final requests. evenly even pinto beans must have to are against the carefully regular de
159|7|3585|629.29|g platelets wake furiously slyly bold deposits? slyly regular accounts across the stealthily ironic accounts cajole along the special, ironic pearls. fluffily regular pinto
159|4|6085|171.40|ross the blithely special deposits are quickly carefully ironic Tiresias. quickly regular deposits was furiously. unusual accounts affix blithely about the regular deposits. asymptotes ab
159|1|3717|790.87|y blithe dependencies. final accounts haggle furiously. even, special asymptotes
160|1|2434|525.73|lithely. furiously silent theodolites after the ca
160|8|8324|999.93|ly final instructions. closely final deposits nag furiously alongside of the furiously dogged theodolites. blithely unusual theodolites are furi
160|5|6034|733.59| furiously against the final instructions. silent accounts sleep blithely after the boldly final requests. ex
160|2|6872|872.20|ions are carefully. carefully express foxes nag slyly before the carefully final excuses. accounts after the furiously ironic packages are furio
161|2|9365|790.03|scapades. packages use. slyly final accounts haggle across the quickly final th
161|10|8421|394.05|cial ideas. ironic instructions eat blithely slyly special packages. furiously final packages alongside of the furiously final instructions boost carefully against the quickly
161|8|9679|688.47|ns. blithely express requests sleep slyly foxes. blithely unusual ideas
161|6|679|893.72| the fluffily final requests. ironic, pending epitaphs affix slyly. qui
162|3|315|923.04| ideas. carefully final dugouts will have to wake quickly regular asymptotes. express grouches unwind carefully after the regula
162|1|2604|104.20|usly regular excuses. silent, even sheaves are according to the regular requests. packages grow blithely slyly regular accounts. ca
162|9|7014|236.07|cording to the stealthily fluffy theodolites. carefully unusual excuses around the regular deposits cajole slyly amo
162|7|4381|824.36|as across the furiously ironic notornis print blithely alongside of the final, pending deposits. fluffily express deposits slee
163|4|9241|955.81|cial dolphins. furiously bold foxes could have to use. never sly accounts cajole fluffily about the unusual, special pinto beans. pending, even requests around the quickly special deposits use f
163|2|3427|499.51|ithely bold packages integrate slyly quiet pinto beans. carefully even deposits boost slyly about the furiously fluffy packages. evenly regular dependencies wa
163|10|5323|920.75|sly even theodolites against the carefully bold packages wake final pinto beans. furiously pending deposits dazzle furiously. blithely exp
163|8|9676|573.48|ending accounts haggle blithely ironic, even packages. carefully pending packages wake carefully across the ruthlessly pending accounts! pinto beans wake. slyly final deposits boost slyly. fluffily
164|5|1295|341.95| bold instructions cajole slyly ironic deposits. quickly ironic foxes are carefully final, bold theodolites. ironic deposi
164|3|2134|84.02|ns believe. carefully express theodolites impress. carefully fina
164|1|3245|814.67|brave accounts cajole according to the final platelets. furiously final dolphins across the furi
164|9|3028|64.89|fully furiously regular requests. furiously bold orbits serve about the regular packages? carefully final deposits p
165|6|4424|943.82|ular requests. regular accounts cajole against the blithely ironic deposits. blithely even packages cajole. furiously final deposits cajole. thinly pending deposits hagg
165|4|5534|717.83| quickly regular deposits above the fluffily thin deposits haggle furiously against the quickly final depend
165|2|3780|730.28| furiously quickly regular foxes. pending requests engage evenly blithel
165|10|6114|210.84|foxes. foxes haggle. dolphins use carefully according to the fluffily regular packages. blithely special accounts according to the slyly final frets breach blithely after the care
166|7|6527|309.00|lly. dependencies haggle carefully at the slyly special packages. regular, final packages
166|5|6508|714.49|y express deposits cajole furiously above the carefully even theod
166|3|9364|581.52|pinto beans. pinto beans cajole furiously carefully special requests-- quickly
166|1|6713|631.58| sleep carefully. quickly even deposits run carefully fluffily ironic orbits. ironic deposits wake furiously. close sheaves along the special packages sleep carefully special instr
167|8|4933|666.70|ular deposits among the even dolphins are quickly express accounts. final, ironic theodolites cajole closely. th
167|6|5789|524.27| are furiously final, even dugouts. ironic, regular packages nag fu
167|4|4756|336.75|es are carefully along the carefully express tithes. furiously even deposits cajole slyly slyly regular deposits. bold excuses about the carefully ironic requests sleep blithely instructions
167|2|6748|704.97|t the silent ideas are blithely carefully even packages; blithely
168|9|347|394.83|hely blithely final theodolites. blithely final deposits among the quickly even ideas haggle about the blithely bold d
168|7|1281|771.90|, pending packages. ironic pinto beans use carefully. fluffily bold deposits
168|5|9089|508.37|ests are always. regular ideas sleep fluffily; special, express instructions cajole slowly. pending platelets boost furiously against the bold, even instructions. bold instructi
168|3|7519|963.43|requests above the quickly regular deposits use carefully aft
169|10|6914|619.53|uickly along the dependencies. furiously pending notornis cajole at the carefully special attainments. carefully ironic packages impress slyly care
169|8|6589|947.03|gside of the quickly regular asymptotes. quickly even theodolites against the theodolites promise express requests. ironic accounts wake careful
169|6|6731|713.35| the quickly special excuses wake blithely alongside of the carefully silent accounts. regular dolphin
169|4|7691|476.19|slyly alongside of the warthogs. fluffily even instructions poach under the slyly pending packages. blithely silent deposits use across the fur
170|1|7516|581.65| pinto beans. unusual ideas was fluffily. excuses cajole carefully final dependencies. platelets nag quickly according to the furiously ironic requests. carefully regular dependenci
170|9|838|667.16|orges do sleep furiously. fluffily furious requests among the final requests sleep after the slyly bold ideas? regular pinto beans might ha
170|7|6498|251.19| fluffily regular accounts integrate. blithely even packages cajole fluffily. furiously ironic excuses haggle by the finally final requ
170|5|6593|202.07|ep blithely final packages. quickly bold pains cajole carefully across the somet
171|2|8217|859.60|ress deposits. carefully special requests are furiously final requests. accounts cajole carefully blith
171|1|2311|864.96|s are along the blithely final deposits. regular asymptotes nag slyly against the requests. accounts cajole carefully carefully
171|10|8561|22.69|y close ideas are quickly silently regular packages. even, silent requests wake against the slyly special dependencies; regular accounts sleep doggedly furiously final pinto beans. slyly unusual pac
171|9|7589|935.29|s above the theodolites wake slyly along the carefully unusual dependencies. carefully express theodolites a
172|3|9799|184.96|ts. slyly even asymptotes nag blithely regular accounts. final platelets cajole furiously slyly bold packages. ironic accounts sleep slyly. pendi
172|2|8333|920.74|ronic foxes. quickly unusual accounts cajole blithely. blithely bold deposits cajole. blithely close pinto beans cajole requests. quickly express excuses around the quickly even deposits nag agai
172|1|3589|437.86|posits should have to boost furiously near the unusual ideas. final packages cajole blithely. carefully final deposits boost carefully. carefully special attainments boost quickly af
172|10|1661|687.13|y among the slyly even requests. ideas according to the slyly pending dinos print quickly slyly ironic foxes. pending, even excuses dazzle car
173|4|2536|353.84|ons-- final, silent dependencies sleep across the special, special excuses. furiously even accounts must have to mold after the ironic accounts. reque
173|3|8307|70.22|alongside of the furiously even packages. furiously final requests snooze blithely alongside of the carefull
173|2|6050|683.78|e after the slyly regular ideas. unusual pinto beans cajole even asymptotes-- silent, stealthy requests after the even accounts haggle blithely regular instructions. slyly ev
173|1|6162|877.84|es. slyly bold requests after the blithely regular dependencies cajole slyly even ideas. unusual deposits integrate about the final somas.
174|5|2103|681.95|sual, express requests wake furiously ruthless, final accounts. carefully ironic somas dazzle furiously. unusual asymptotes sleep-- patterns about the furiousl
174|4|6795|143.48|regular theodolites. special accounts integrate across the carefully ironic Tiresias. blithely even platelets detect. foxes about t
174|3|111|135.46| express packages-- quickly unusual courts lose carefully requests. bold accounts solve about the theodolites; pinto beans use. ironic foxes
174|2|8404|126.20|nding accounts mold furiously. slyly ironic foxes boost express sheaves. daringly final packages along the stealthy dependencies are blithely ironic requests. furiously pending pin
175|6|5515|487.68|ages sleep against the Tiresias. slyly pending packages print slyly above the evenly ironic dolphins. furiously ironic packages use f
175|5|7522|784.93| affix. quickly final theodolites haggle furiously after the slowly even pinto beans. furiously final packages use slyly. slyly regular reque
175|4|8501|706.61|int above the instructions. furiously regular requests integrate blithely according to the instructions. slyly pending foxes are asymptotes. slyly ruthless accounts wake. r
175|3|9456|978.56| regular packages. carefully ironic packages use. blithely ironic accounts among the pending,
176|7|7180|179.09|riously final requests. accounts doubt blithely regular somas. slyly even platelets are. theodolites across
176|6|3589|157.38|inal excuses. express deposits haggle carefully even deposits. carefully unusual requests haggle along the fluffily bold deposits. even, final requests affix. furi
176|5|5407|947.51|ending accounts eat carefully instructions. carefully pending packages detect slyly express accounts. foxes wake fluffily across th
176|4|1783|861.63|g the carefully special platelets. dogged, ironic asymptotes wake requests. regular excus
177|8|1239|44.75|requests use furiously regular, final requests. regular requests on the pending, ironic deposits use slyly among the excuses. carefully regular sheaves are.
177|7|4349|63.36|osits sleep among the fluffily unusual instructions. ironic dolphins cajole. furiously bold deposits sleep carefully. even, unusual accounts
177|6|9872|252.42|sual platelets. bold foxes affix furiously. pending, pending accounts lose furiously. pending platelets along the unusual, even foxes wake regular, even theo
177|5|4727|859.82|es are. slyly ironic packages haggle around the slyly bold deposits. bold foxes haggle blithely. f
178|9|4231|558.56|deposits. patterns use against the furiously unusual accounts. accounts wake carefully above the careful
178|8|1919|362.26| ironic dependencies. blithely regular packages detect fluffily special theodolites. regular instructions poach-- ironic deposits along the final requests
178|7|6836|864.93|y. ideas integrate regular pinto beans. special foxes wake above the slyly ironic asymptotes. quickly ironic ideas sleep. silent dependencies against the slyly bold packa
178|6|6922|475.18| regular patterns. fluffily express accounts about the furiously bold deposits cajole slyly about the furiously silent foxe
179|10|6956|444.38|g the furiously careful excuses haggle quickly thinly special Tiresias. furiously express foxes after the quickly regular deposits sleep ironic packages
179|9|1954|372.75|even dependencies print carefully. deposits boost blithely about the ironic, ironic accounts. express, regular deposits are. bli
179|8|2710|277.15|d the frets. pending packages doze quickly across the furiously regular deposits. pending, even deposits impress ironic ideas. quickly regular r
179|7|4776|8.39|sly special pinto beans. pinto beans cajole. carefully unusual ideas around the silent accounts are blithely carefully ev
180|1|2467|440.25| instructions affix. regular packages cajole quickly. carefully express asymptotes use furiously around the pendin
180|10|1108|934.59|hinly after the regular, unusual asymptotes! carefully regular theodolites sublate. regular, ironic deposits against the regular pinto beans nag ca
180|9|724|426.16|e, regular accounts. furiously final ideas are furiously above the bold, silent asymptotes. sly instructions are carefully quickly final sentiments. furiously ironic foxes cajole bold, exp
180|8|5899|864.83|hin the carefully furious pinto beans. furiously ironic pinto beans use slyly above the even instructio
181|2|2416|844.44|ully. theodolites throughout the blithely unusual pinto bea
181|3|3242|886.53| express ideas nag carefully brave accounts. slyly express deposits would affix. final, special requests against the slyl
181|4|215|938.29| accounts boost furiously furiously blithe theodolites. slyly bold requests unwind special, unusual requests. furious ideas boost quickly pending
181|5|1122|657.25|lyly fluffily pending foxes. fluffily ironic pains haggle. thinly regular requests against the deposits affix after the never ev
182|3|9699|535.27|ound the furiously regular foxes. pending requests dazzle along
182|2|960|519.36|arefully pending dependencies are always slyly unusual pin
182|1|6243|741.46|accounts are slyly. furiously ironic requests haggle. express, special instructions against the ironic theodolites use s
182|4|6146|365.00|s. blithely express theodolites sleep blithely alongside of the requests?
183|4|30|875.44|slyly. furiously regular instructions cajole slyly about the pending, final theodolites. blithely final deposits cajole fluffily alo
183|5|4482|424.86|es. depths affix fluffily. bold instructions haggle. ruthless instructions must have to boost
183|6|8707|884.26|posits wake. blithely pending requests nag furiously alongside of the p
183|7|333|678.16|ost final, final theodolites. slyly bold foxes dazzle carefully furiously regular accounts. regular, sly instructions about the furiously regular excuses nag blithely abou
184|5|7069|449.45|nal ideas. blithely final ideas haggle against the pinto beans. qu
184|6|9193|576.88|uickly quick dependencies could detect furiously. final packages p
184|7|6400|551.90|ss dependencies. quickly even pinto beans are. express accounts a
184|8|831|186.84|kages cajole carefully furiously ironic instructions. deposits use bl
185|6|1475|538.58|unts hinder slyly. quickly express ideas sleep carefully
185|5|6244|213.04|ly unusual decoys are furiously quickly regular packages. bold, ironic foxes cajole fluffily around
185|4|7245|426.74|sleep blithely alongside of the regular excuses. even, regular
185|3|8014|510.23|lithely even ideas. regular platelets wake carefully ironic, special instructions! final pearls above the fluffily quiet ideas use furiously about the
186|7|1095|252.84|. carefully regular pinto beans according to the blithely close asymptotes haggle carefully special requests. packages cajole up the furi
186|8|1945|18.75|nic foxes boost carefully careful packages: express, fluffy dolphins nag quickly ironic packages. slyly bold requests nag amon
186|9|8838|729.42|ing asymptotes. enticingly regular theodolites mai
186|10|7898|812.37|ctions sleep silently carefully bold platelets. furiously ironic dependencies boost. regular de
187|7|8656|238.66|tes use along the even foxes? final foxes haggle pinto beans. slyly ironic theodolites are according to the deposits. furiously pending reques
187|8|4945|316.64|eposits boost quickly bold requests. furiously regular ideas boost boldly. special, express dependencies are fluffily slyly reg
187|3|3183|362.75|t the bold platelets. fluffily express platelets cajole fluffily along the always bold requests. blith
187|4|7440|989.71|e slyly against the slyly regular pinto beans. requests haggle carefully around the asymptotes. regular, regular asymptotes use furiously some
188|9|4835|771.95|pains are fluffily about the fluffily pending asymptot
188|8|2620|331.70|elets nag slyly regular pinto beans. slyly even dugouts above the blithely unusual theodolites su
188|7|730|713.62|nag against the final accounts. blithely pending attainments lose. silent requests wake quickly. careful
188|6|5430|920.20|uriously. special, regular instructions sleep along the accounts. quickly even foxes across the regular theodolites hang u
189|10|1305|392.50|packages. regular, unusual accounts lose furiously fluffily regular platelets. requests sleep carefully dependenc
189|1|8777|573.22|beans cajole slyly ironic requests. requests are quickly unusual, even packages. ironic frays haggle. blithely pending requests nod slyly. express, silent requests against the slyly unusual
189|2|6369|946.07|ts hinder slyly regular, unusual foxes. final sentiments use above the slyly r
189|3|2505|593.23| the deposits. special deposits sleep-- furiously regular sauternes solve furiously across the furiously regular pack
190|1|535|621.53|unts must have to haggle; slyly ironic accounts affix slyly alongside of the carefully even accounts. furious deposits haggle quietly among the packages. blithely
190|4|5845|608.91| haggle along the carefully unusual pinto beans. quickly final accounts sleep a
190|5|4579|396.60|inal, final foxes. regular, even deposits wake blithely! silent, regular packages integrate according to the slyly regular deposits. ironic, ironic notornis ha
190|6|2861|458.00|s cajole slyly across the daring, final pinto beans. carefully quiet requests affix along the a
191|2|8310|521.06|the slowly regular deposits. special accounts along the quickly unusual
191|3|1693|464.46|y. slyly unusual waters across the special pinto beans nag blithely according to the busy deposits. carefully regular accounts are against the regular accounts; perman
191|4|597|126.96|ly final accounts should have to boost above the doggedly express pinto beans. blithely regular packages cajole furiously bold requests. fluf
191|5|9673|119.41|press deposits kindle theodolites! slyly final dependencies against the blithely final packages sleep slyly regular requests. theodolites cajole furiously quickly bold a
192|3|606|198.69|inal platelets integrate regular accounts. accounts wake ironic, silent accounts. slyly unusual accounts kindle carefully-
192|4|2656|916.16|uickly. slyly bold ideas affix special, close theodolites. ironic, pending requests use carefully. blithely regular
192|5|1811|359.59|ly carefully special asymptotes. furiously pending instructions haggle blithely bravely pending requests. carefully f
192|6|8305|861.23|s against the carefully regular foxes haggle fluffily across the pending accounts. blithely final packages sleep after the furiously ironic theodolites. quickly bold r
193|4|6184|335.98| quickly bold deposits cajole furiously ruthless courts. carefully
193|5|4762|606.19|ns sleep against the furiously regular asymptotes. carefully even asymptotes across the daringly final packages sleep fluf
193|6|385|571.71|ons. slyly ironic deposits wake furiously ironic, unus
193|7|9791|478.52|quests. carefully even requests use regular excuses. pending accounts are. furiously even pinto beans haggle furi
194|5|4289|662.17|ic Tiresias serve along the ironic, express accounts. quickly final requests are slyly among the carefully special requests. accounts boost.
194|6|377|430.21|efully instead of the special ideas. fluffily unusual asymptotes cajole blithely after the regular ideas. final accounts along the silent ex
194|7|5294|913.46|indle fluffily despite the carefully silent instructions. furiously regular hockey players cajole slyly unusual accounts. furiously regular realms cajole furiously according to the e
194|8|7890|79.40|ctions sleep. carefully unusual theodolites should wake furiously across the deposits-- furiously bold excuses boost furiously carefully slow accounts. boldly final accounts grow. regular excuse
195|6|9985|20.39|efully among the fluffily even accounts! requests are slyly ag
195|7|2947|271.39|yly regular requests cajole carefully. carefully fina
195|8|319|102.58|ts. ironic foxes wake carefully slyly special pinto beans. blithely silent excuses hinder blithely quietly regular accounts. quickly careful foxes maintain slyly above the slyly express fo
195|9|2803|992.27|xes according to the regular foxes wake furiously final theodolites. furiously regular packages sleep slyly express theodolites. slyly thin instructions sleep r
196|7|3843|859.90|l platelets use blithely alongside of the enticingly final deposits. fluffily final requests boost furiously ag
196|8|2515|966.01|final theodolites. fluffily even deposits are against the
196|9|4778|37.61|fully final requests cajole fluffily across the furiously ironic accounts. qui
196|10|1068|928.25| cajole about the blithely regular ideas. final ideas hin
197|8|9678|753.88|ously. slyly stealthy requests use alongside of the express, unusual packages. final deposits wake. carefully unusual theodolites cajole slyly about the regular foxes. slyly iron
197|9|2631|279.05|e blithely. quickly final deposits wake fluffily excuses. even, unusual deposits x-ray among the final accounts. even ideas above the blithely ironic requests sleep furiously slyly final inst
197|10|7598|845.51|lets according to the regular deposits wake furiously about the carefully daring theodolites. blithely express dolphins poach after th
197|1|8950|897.33|ideas. requests wake above the blithely unusual deposits. slyly regular
198|9|6878|587.41|y even accounts poach carefully about the asymptotes. deposits haggle slyly. finally unusual requests run silently regular, bold packages: instructions after the
198|10|6493|673.99|y express excuses use blithely among the pending accounts. stealthy ide
198|1|8410|166.93|kages. blithely final theodolites dazzle fluffily. accounts boost furiously. furiously unu
198|2|6190|697.10|beans nag fluffily about the asymptotes. slyly bold escapades haggle quickly. fluffily special requests haggle above the ironic,
199|10|9343|79.70|ending accounts nag across the instructions. carefully express packages over the blithely even pac
199|1|8199|46.52|oost slyly. ironic platelets sleep blithely about the slyly silent foxes. furiously even pl
199|2|2742|890.63| the special deposits? carefully final deposits about the carefully regular sauternes
199|3|7167|884.56|onic platelets use carefully along the slowly stealthy ideas. slyly dogged instructions are quickly above the slyly u
200|1|3120|776.41|ntly final packages kindle furiously blithely ironic accounts. carefully final packages according to the carefully
200|2|5392|242.52|y unusual ideas. ruthlessly express asymptotes cajole. regular theodolites are. carefully silent deposits poach carefully across the fluffily even theodolites. carefully express realms hag
200|3|9408|307.79|oxes! fluffily regular requests use against the unusual, slow ideas. ironic accounts doze b
200|4|331|466.07| slyly even requests. fluffily final packages boost carefully express instructions. slyly regular forges are blithely unusual, regular
| 142.438202 | 216 | 0.823723 |
4a959caca293ed915b8de34f316bfb2290b4abf6 | 1,782 | cbl | COBOL | cobol/testdata/local/testantlr201.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr201.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr201.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | Identification Division. 00000001
Program-ID. testantlr201. 00000002
Data Division. 00000003
Working-Storage Section. 00000004
01 CONSTANTS. 00000005
05 MYNAME PIC X(012) VALUE 'testantlr201'. 00000006
00000007
* 00000008
00000009
Procedure Division. 00000010
DISPLAY MYNAME ' Begin' 00000011
00000012
00000013
DISPLAY MYNAME ' End' 00000014
00000015
GOBACK 00000016
. 00000017
00000018
1000-para. 00000019
00000020
. 00000021
00000022
| 77.478261 | 80 | 0.20202 |
4d3009554da0877ec2d5197bbd86930091a5f39c | 2,065 | cbl | COBOL | cobol/testdata/local/testantlr055.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr055.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr055.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | ID Division.
Program-ID. testantlr055.
Procedure Division.
>>DEFINE VAR1 'ALICE'
>>DEFINE VAR2 'JULIA'
>>DEFINE VAR3 'KADY'
>>DEFINE VAR4 'MARGOT'
>>EVALUATE VAR1
>>WHEN 'MARGOT'
EXEC CICS
LINK
PROGRAM('PGM00001')
END-EXEC
>>WHEN VAR3
EXEC CICS
LINK
PROGRAM('PGM00002')
END-EXEC
>>WHEN VAR4
EXEC CICS
LINK
PROGRAM('PGM00003')
END-EXEC
>>WHEN OTHER
EXEC CICS
LINK
PROGRAM('PGM00004')
END-EXEC
>>END-EVALUATE
>>EVALUATE VAR1
>>WHEN 'ALICE'
EXEC CICS
LINK
PROGRAM('PGM00005')
END-EXEC
>>WHEN VAR2
EXEC CICS
LINK
PROGRAM('PGM00006')
END-EXEC
>>WHEN VAR4
EXEC CICS
LINK
PROGRAM('PGM00007')
END-EXEC
>>WHEN OTHER
EXEC CICS
LINK
PROGRAM('PGM00008')
END-EXEC
>>END-EVALUATE
>>IF VAR2 = 'BRAKEBILLS'
EXEC CICS
LINK
PROGRAM('PGM00009')
END-EXEC
>>ELSE
EXEC CICS
LINK
PROGRAM('PGM00010')
END-EXEC
>>END-IF
>>IF VAR1 DEFINED
EXEC CICS
LINK
PROGRAM('PGM00011')
END-EXEC
>>END-IF
>>IF VAR5 DEFINED
>>IF VAR5 = 'QUENTIN'
EXEC CICS
LINK
PROGRAM('PGM00012')
END-EXEC
>>END-IF
>>ELSE
>>DEFINE VAR5 'PENNY'
>>END-IF
>>IF VAR5 = 'PENNY'
EXEC CICS
LINK
PROGRAM('PGM00013')
END-EXEC
>>END-IF
GOBACK.
| 21.736842 | 39 | 0.380145 |
2f996a47f403cd0acb718bd22826a06c308e829a | 6,074 | cob | COBOL | languages/cobol/cobol24/ch18/chapt18d.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 34 | 2016-10-29T19:50:34.000Z | 2022-02-12T21:27:43.000Z | languages/cobol/cobol24/ch18/chapt18d.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | null | null | null | languages/cobol/cobol24/ch18/chapt18d.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 19 | 2017-06-19T23:04:00.000Z | 2021-11-13T15:00:41.000Z | 000010 @OPTIONS MAIN,TEST
000020 Identification Division.
000030 Program-Id. Chapt18d.
000031* Indexed File Update
000043 Environment Division.
000050 Configuration Section.
000055 Source-Computer. IBM-PC.
000056 Object-Computer. IBM-PC.
000061 Input-Output Section.
000062 File-Control.
000063 Select Optional Trans-File Assign To "Trans.Txt"
000064 Organization Is Line Sequential.
000066 Select Optional Dealer-File Assign To "Dealer.Dat"
000067 Organization Indexed
000068 Access Random
000069 Record Key Dealer-Number
000070 Alternate Record Key Dealer-Name
000071 File Status Dealer-Status.
000074 Select Optional Reject-File Assign To "Reject.Txt"
000075 Organization Is Line Sequential.
000076 Data Division.
000077 File Section.
000078 Fd Trans-File.
000079 01 Trans-Record.
000080 03 Transaction-Date Pic 9(8).
000081 03 Transaction-Text.
000082 05 Transaction-Type Pic X(4).
000083 05 Transaction-Dealer Pic X(8).
000084 03 Transaction-Price Pic S9(7)v99.
000085 03 Transaction-Qty Pic 9(3).
000086 03 Filler Pic X(40).
000087 Fd Reject-File.
000088 01 Reject-Record Pic X(72).
000093 Fd Dealer-File.
000094 01 Dealer-Record.
000095 03 Dealer-Number Pic X(8).
000096 03 Dealer-Name.
000097 05 Last-Name Pic X(25).
000098 05 First-Name Pic X(15).
000099 05 Middle-Name Pic X(10).
000100 03 Address-Line-1 Pic X(50).
000101 03 Address-Line-2 Pic X(50).
000102 03 City Pic X(40).
000103 03 State-Or-Country Pic X(20).
000104 03 Postal-Code Pic X(15).
000105 03 Home-Phone Pic X(20).
000106 03 Work-Phone Pic X(20).
000107 03 Other-Phone Pic X(20).
000108 03 Start-Date Pic 9(8).
000109 03 Last-Rent-Paid-Date Pic 9(8).
000110 03 Next-Rent-Due-Date Pic 9(8).
000111 03 Rent-Amount Pic 9(4)v99.
000112 03 Consignment-Percent Pic 9(3).
000113 03 Last-Sold-Amount Pic S9(7)v99.
000114 03 Last-Sold-Date Pic 9(8).
000115 03 Sold-To-Date Pic S9(7)v99.
000116 03 Commission-To-Date Pic S9(7)v99.
000117 03 Filler Pic X(15).
000144 Working-Storage Section.
000145 01 Current-Commission Pic S9(7)v99 Value Zeros.
000146 01 Total-Commission Pic S9(7)v99 Value Zeros.
000154 01 Transactions-Read Pic 9(5) Value Zeros.
000164 01 Transactions-Rejected Pic 9(5) Value Zeros.
000174 01 Work-Date.
000184 03 Work-MM Pic 9(2).
000194 03 Work-DD Pic 9(2).
000195 03 Work-YYYY Pic 9(4).
000196 01 Reverse-Date.
000197 03 Work-YYYY Pic 9(4).
000198 03 Work-MM Pic 9(2).
000199 03 Work-DD Pic 9(2).
000200 01 Compare-Date-1 Pic 9(8).
000201 01 Compare-Date-2 Pic 9(8).
000202 01 Used-Transaction-Flag Pic X Value Spaces.
000203 88 Used-This-Tran Value "Y".
000204 01 Edit-Count Pic ZZ,ZZ9.
000205 01 Edit-Amt Pic Z,ZZZ,ZZZ.99-.
000206 01 Dealer-Status Pic XX Value Zeros.
000207 88 Dealer-Success Value "00" Thru "09".
000208 01 Trans-Flag Pic X Value Spaces.
000209 88 End-Of-Trans Value "Y".
000211 01 Dealer-Flag Pic X Value Spaces.
000212 88 Dealer-Error Value "Y".
000213 Procedure Division.
000214 Declaratives.
000215 Dealer-File-Error Section.
000216 Use After Standard Error Procedure On Dealer-File
000217 .
000218 Dealer-Error-Paragraph.
000219 Display "Error on Dealer File " Dealer-Status
000220 Set Dealer-Error To True
000221 .
000222 End Declaratives.
000223 Chapt18d-Start.
000224 Display "Begin Process Chapt18d"
000225 Open Output Reject-File
000235 Input Trans-File
000245 I-O Dealer-File
000255 Perform Process-Files Until End-Of-Trans Or Dealer-Error
000265 Close Reject-File
000305 Trans-File
000315 Dealer-File
000316 Move Transactions-Read To Edit-Count
000317 Display "Processing Complete"
000318 Display "Transactions Read " Edit-Count
000319 Move Transactions-Rejected To Edit-Count
000320 Display "Transactions Rejected " Edit-Count
000321 Move Total-Commission To Edit-Amt
000322 Display "Total Commission " Edit-Amt
000323 Stop Run
000325 .
000326
000335 Process-Files.
000336 Read Trans-File
000337 At End Set End-Of-Trans To True
000338 Not At End
000339 Add 1 To Transactions-Read
000340 Perform Attempt-Transaction
000341 End-Read
000485 .
000495 Attempt-Transaction.
000496 Move Transaction-Dealer To Dealer-Number
000497 Read Dealer-File
000498 Invalid Key
000499 Perform Write-Reject
000500 Not Invalid Key
000501 Perform Apply-Transaction
000502 End-Read
000503 .
000504 Apply-Transaction.
000505 Compute Sold-To-Date = Sold-To-Date +
000525 (Transaction-Qty * Transaction-Price)
000526 Compute Current-Commission Rounded =
000527 (Transaction-Qty * Transaction-Price) *
000528 (Consignment-Percent / 100)
000529 Add Current-Commission To Commission-To-Date
000530 Total-Commission
000531 Move Last-Sold-Date To Work-Date
000532 Move Corresponding Work-Date To Reverse-Date
000533 Move Reverse-Date To Compare-Date-1
000534 Move Transaction-Date To Work-Date
000535 Move Corresponding Work-Date To Reverse-Date
000536 Move Reverse-Date To Compare-Date-2
000537 If Compare-Date-2 > Compare-Date-1
000538 Move Transaction-Date To
000539 Last-Sold-Date
000540 End-If
000541 Rewrite Dealer-Record
000542 .
000563 Write-Reject.
000564 Add 1 To Transactions-Rejected
000565 Write Reject-Record From Trans-Record
000566 .
| 39.441558 | 67 | 0.656404 |
7ebcda3af9bd560ef725a10bb4d155ec4d5ca0ad | 7,246 | cob | COBOL | languages/cobol/cobol24/ch19/chapt19b.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 34 | 2016-10-29T19:50:34.000Z | 2022-02-12T21:27:43.000Z | languages/cobol/cobol24/ch19/chapt19b.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | null | null | null | languages/cobol/cobol24/ch19/chapt19b.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 19 | 2017-06-19T23:04:00.000Z | 2021-11-13T15:00:41.000Z | 000010 @OPTIONS MAIN,TEST
000020 Identification Division.
000030 Program-Id. Chapt19b.
000031* Simple Report - Some Data Selection
000043 Environment Division.
000050 Configuration Section.
000055 Source-Computer. IBM-PC.
000056 Object-Computer. IBM-PC.
000061 Input-Output Section.
000062 File-Control.
000063 Select Report-File Assign To Printer.
000066 Select Dealer-File Assign To "Dealer.Dat"
000067 Organization Indexed
000068 Access Sequential
000069 Record Key Dealer-Number
000070 Alternate Record Key Dealer-Name
000071 File Status Dealer-Status.
000076 Data Division.
000077 File Section.
000078 Fd Report-File.
000079 01 Report-Record Pic X(80).
000093 Fd Dealer-File.
000094 01 Dealer-Record.
000095 03 Dealer-Number Pic X(8).
000096 03 Dealer-Name.
000097 05 Last-Name Pic X(25).
000098 05 First-Name Pic X(15).
000099 05 Middle-Name Pic X(10).
000100 03 Address-Line-1 Pic X(50).
000101 03 Address-Line-2 Pic X(50).
000102 03 City Pic X(40).
000103 03 State-Or-Country Pic X(20).
000104 03 Postal-Code Pic X(15).
000105 03 Home-Phone Pic X(20).
000106 03 Work-Phone Pic X(20).
000107 03 Other-Phone Pic X(20).
000108 03 Start-Date Pic 9(8).
000109 03 Last-Rent-Paid-Date Pic 9(8).
000110 03 Next-Rent-Due-Date Pic 9(8).
000111 03 Rent-Amount Pic 9(4)v99.
000112 03 Consignment-Percent Pic 9(3).
000113 03 Last-Sold-Amount Pic S9(7)v99.
000114 03 Last-Sold-Date Pic 9(8).
000115 03 Sold-To-Date Pic S9(7)v99.
000116 03 Commission-To-Date Pic S9(7)v99.
000117 03 Filler Pic X(15).
000144 Working-Storage Section.
000206 01 Dealer-Status Pic XX Value Zeros.
000207 88 Dealer-Success Value "00" Thru "09".
000209 01 Heading-Line-1.
000210 03 Filler Pic X(12) Value "Created by:".
000211 03 Filler Pic X(8) Value "CHAPT19B".
000212 03 Filler Pic X(11) Value Spaces.
000213 03 Filler Pic X(23) Value "Dealer File Rent Report".
000214 03 Filler Pic X(10) Value Spaces.
000215 03 Filler Pic X(5) Value "Page".
000216 03 Page-No Pic Z(4)9 Value Zeros.
000217 01 Heading-Line-2.
000218 03 Filler Pic X(12) Value "Created on:".
000219 03 Date-MM Pic 99.
000220 03 Filler Pic X Value "/".
000221 03 Date-DD Pic 99.
000222 03 Filler Pic X Value "/".
000223 03 Date-YY Pic 99.
000224 01 Heading-Line-3.
000225 03 Filler Pic X(12) Value "At:".
000226 03 Time-HH Pic 99.
000227 03 Filler Pic X Value ":".
000228 03 Time-MM Pic 99.
000229 03 Filler Pic X Value ":".
000230 03 Time-SS Pic 99.
000231 01 Heading-Line-4.
000232 03 Filler Pic X(41) Value Spaces.
000233 03 Filler Pic X(27) Value "Last Rent Next Rent".
000234 03 Filler Pic X(4) Value "Rent".
000235 01 Heading-Line-5.
000236 03 Filler Pic X(44) Value "Name".
000237 03 Filler Pic X(29) Value "Paid Due Amount".
000238 01 Detail-Line.
000239 03 Detail-Name Pic X(40) Value Spaces.
000240 03 Filler Pic X Value Spaces.
000241 03 Last-Rent-Paid-Date Pic 99/99/9999.
000242 03 Filler Pic X Value Spaces.
000243 03 Next-Rent-Due-Date Pic 99/99/9999.
000244 03 Filler Pic X Value Spaces.
000245 03 Rent-Amount Pic $$$,$$$.99.
000246 01 Line-Count Pic 99 Value 99.
000247 01 Page-Count Pic 9(4) Value Zeros.
000248 01 Max-Lines Pic 99 Value 60.
000249 01 Date-And-Time-Area.
000250 03 Work-Date Pic 9(6).
000251 03 Work-Date-X Redefines Work-Date.
000252 05 Date-YY Pic 99.
000253 05 Date-MM Pic 99.
000254 05 Date-DD Pic 99.
000255 03 Work-Time Pic 9(8).
000256 03 Work-Time-X Redefines Work-Time.
000257 05 Time-HH Pic 99.
000258 05 Time-MM Pic 99.
000259 05 Time-SS Pic 99.
000260 05 Filler Pic XX.
000261
000262 Procedure Division.
000263 Declaratives.
000264 Dealer-File-Error Section.
000265 Use After Standard Error Procedure On Dealer-File
000266 .
000267 Dealer-Error-Paragraph.
000268 Display "Error on Dealer File " Dealer-Status
000269 .
000270 End Declaratives.
000271 Chapt19a-Start.
000272 Display "Begin Process Chapt19b"
000273 Perform Open-Files
000274 If Dealer-Success
000275 Perform Fill-Initial-Headings
000276 Perform Start-Alternate-Key
000277 Perform Process-File Until Not Dealer-Success
000278 Perform Close-Files
000279 End-If
000280 Stop Run.
000281 Start-Alternate-Key.
000282 Move Low-Values To Dealer-Name
000283 Start Dealer-File Key Not < Dealer-Name
000284 .
000285 Process-File.
000286 Read Dealer-File
000287 At End Continue
000288 Not At End
000289 If Dealer-Number (1:1) = "C"
000290 Perform Print-This-Record
000291 End-If
000292 End-Read
000293 .
000294 Print-This-Record.
000295 Perform Format-Name
000296 Move Corresponding Dealer-Record To Detail-Line
000297 If Line-Count >= Max-Lines
000298 Perform Heading-Routine
000299 End-If
000300 Write Report-Record From Detail-Line After 1
000301 Add 1 To Line-Count
000302 .
000303 Heading-Routine.
000304 Add 1 To Page-Count
000305 Move Page-Count To Page-No
000306 If Page-Count = 1
000307 Write Report-Record From Heading-Line-1 After Zero
000308 Else
000309 Write Report-Record From Heading-Line-1 After Page
000310 End-If
000311 Write Report-Record From Heading-Line-2 After 1
000312 Write Report-Record From Heading-Line-3 After 1
000313 Write Report-Record From Heading-Line-4 After 2
000314 Write Report-Record From Heading-Line-5 After 1
000315 Write Report-Record From Heading-Line-5 Before 2
000316 Move 7 To Line-Count
000317 .
000318 Format-Name.
000319 Move Spaces To Detail-Name
000320 String First-Name Delimited By Space
000321 " " Delimited By Size
000322 Middle-Name Delimited By Space
000323 " " Delimited By Size
000324 Last-Name Delimited By Space
000325 Into Detail-Name
000326 End-String
000327 .
000328 Fill-Initial-Headings.
000329 Accept Work-Date From Date
000330 Accept Work-Time From Time
000331 Move Corresponding Work-Date-X To
000332 Heading-Line-2
000333 Move Corresponding Work-Time-X To
000334 Heading-Line-3
000335 .
000336 Open-Files.
000337 Open Output Report-File
000338 Input Dealer-File
000339 .
000340 Close-Files.
000341 Close Report-File
000342 Dealer-File
000343 .
| 39.380435 | 72 | 0.627657 |
043ec2287ac3f50a37a26d01bd9ad05eb861967e | 2,120 | cpy | COBOL | cpy/CSR01300.cpy | abrignoli/COBSOFT | 9b8d567465ba40ece8efc985209adc14263cbad1 | [
"MIT"
] | 3 | 2019-03-17T18:36:33.000Z | 2020-08-12T21:21:55.000Z | cpy/CSR01300.cpy | abrignoli/COBSOFT | 9b8d567465ba40ece8efc985209adc14263cbad1 | [
"MIT"
] | null | null | null | cpy/CSR01300.cpy | abrignoli/COBSOFT | 9b8d567465ba40ece8efc985209adc14263cbad1 | [
"MIT"
] | null | null | null | *>================================================================
9000-abrir-i-pd01300 section.
string lnk-dat-path delimited by " " "\EFD013.DAT" into wid-pd01300
open input pd01300
if not ws-operacao-ok
string "Erro de abertura arquivo EFD013.DAT - Status [" ws-resultado-acesso "]" into ws-mensagem
perform 9000-mensagem
perform 9000-abortar
end-if
exit.
*>================================================================
9000-abrir-io-pd01300 section.
string lnk-dat-path delimited by " " "\EFD013.DAT" into wid-pd01300
open i-o pd01300
if not ws-operacao-ok
string "Erro de abertura arquivo EFD013.DAT - Status [" ws-resultado-acesso "]" into ws-mensagem
perform 9000-mensagem
perform 9000-abortar
end-if
exit.
*>================================================================
9000-str-pd01300-gtr section.
start pd01300 key is greater f01300-chave
exit.
*>================================================================
9000-ler-pd01300-ran section.
read pd01300
exit.
*>================================================================
9000-ler-pd01300-nex section.
read pd01300 next
exit.
*>================================================================
9000-gravar-pd01300 section.
write f01300-usuario-modulo
exit.
*>================================================================
9000-regravar-pd01300 section.
rewrite f01300-usuario-modulo
exit.
| 27.894737 | 112 | 0.331604 |
2c481d60848504e6b7e8d6498362725907f90c04 | 1,949 | cpy | COBOL | TRANREC.cpy | ffdumont/wazi-tutorial | ff6e3b68d38e66cad7862471ac904bb32da2e727 | [
"Apache-2.0"
] | null | null | null | TRANREC.cpy | ffdumont/wazi-tutorial | ff6e3b68d38e66cad7862471ac904bb32da2e727 | [
"Apache-2.0"
] | null | null | null | TRANREC.cpy | ffdumont/wazi-tutorial | ff6e3b68d38e66cad7862471ac904bb32da2e727 | [
"Apache-2.0"
] | null | null | null | ****************************************************************
* LICENSED MATERIALS - PROPERTY OF IBM
* "RESTRICTED MATERIALS OF IBM"
* (C) COPYRIGHT IBM CORPORATION 2018. ALL RIGHTS RESERVED
* US GOVERNMENT USERS RESTRICTED RIGHTS - USE, DUPLICATION,
* OR DISCLOSURE RESTRICTED BY GSA ADP SCHEDULE
* CONTRACT WITH IBM CORPORATION
****************************************************************
01 TRANSACTION-RECORD.
05 TRAN-CODE PIC X(6).
05 FILLER REDEFINES TRAN-CODE.
10 TRAN-COMMENT PIC X.
10 FILLER PIC X(5).
05 FILLER PIC X.
05 TRAN-PARMS.
10 TRAN-KEY PIC X(06).
10 FILLER PIC X(08).
10 TRAN-ACTION PIC X(8).
10 FILLER PIC X.
10 TRAN-FIELD-NAME PIC X(10).
10 FILLER PIC X.
10 TRAN-FIELD-SS PIC 99.
10 FILLER PIC X.
10 TRAN-UPDATE-DATA PIC X(36).
10 FILLER REDEFINES TRAN-UPDATE-DATA.
15 TRAN-UPDATE-NUM PIC 9(7)V99.
15 FILLER PIC X(27).
10 FILLER REDEFINES TRAN-UPDATE-DATA.
15 TRAN-UPDATE-NUMX.
20 TRAN-UPDATE-NUMX1 PIC X.
20 TRAN-UPDATE-NUMX2-7 PIC X(6).
15 TRAN-UPDATE-NUM-HH PIC 99.
15 FILLER PIC X(27).
05 CRUNCH-PARMS REDEFINES TRAN-PARMS.
10 CRUNCH-IO-LOOPS PIC 9(5).
10 FILLER PIC X.
10 CRUNCH-CPU-LOOPS PIC 9(9).
10 FILLER PIC X(55).
| 48.725 | 70 | 0.388917 |
0d0338e153f3bf592761a28bb1f319a907afd91c | 4,836 | cpy | COBOL | COBOL-Samples/Global Auto Mart COBOL Sample/GAM_COBOL/COPYBOOK/GAM0BMT.cpy | vijay504/idz-utilities | ddb2ae6fb632fa02e0499dca2af84927f4ad41c8 | [
"Apache-2.0"
] | null | null | null | COBOL-Samples/Global Auto Mart COBOL Sample/GAM_COBOL/COPYBOOK/GAM0BMT.cpy | vijay504/idz-utilities | ddb2ae6fb632fa02e0499dca2af84927f4ad41c8 | [
"Apache-2.0"
] | null | null | null | COBOL-Samples/Global Auto Mart COBOL Sample/GAM_COBOL/COPYBOOK/GAM0BMT.cpy | vijay504/idz-utilities | ddb2ae6fb632fa02e0499dca2af84927f4ad41c8 | [
"Apache-2.0"
] | null | null | null | ******************************************************************
* *
* MODULE NAME GAM0BMT.cpy *
* *
* STATEMENT IBM WebSphere Developer for System z *
* 5724-L44 *
* (c) Copyright IBM Corp. 2006 *
* *
* DISCLAIMER OF WARRANTIES *
* You may copy, modify, and distribute these samples, or their *
* modifications, in any form, internally or as part of your *
* application or related documentation. These samples have not *
* been tested under all conditions and are provided to you by *
* IBM without obligation of support of any kind. IBM PROVIDES *
* THESE SAMPLES "AS IS" SUBJECT TO ANY STATUTORY WARRANTIES THAT *
* CANNOT BE EXCLUDED. IBM MAKES NO WARRANTIES OR CONDITIONS, *
* EITHER EXPRESS OR IMPLIED, INCLUDING BUT NOT LIMITED TO, THE *
* IMPLIED WARRANTIES OR CONDITIONS OF MERCHANTABILITY, FITNESS *
* FOR A PARTICULAR PURPOSE, AND NON-INFRINGEMENT REGARDING THESE *
* SAMPLES OR TECHNICAL SUPPORT, IF ANY. *
* You will indemnify IBM or third parties that provide IBM *
* products ("Third Parties") from and against any third party *
* claim arising out of the use, modification or distribution of *
* these samples with your application. You may not use the same *
* path name as the original files/modules. You must not alter or *
* delete any copyright information in the Samples. *
* *
******************************************************************
******************************************************************
* DCLGEN TABLE(MAKE_MODEL) *
* LIBRARY(CUST.GAM.COPYLIB(GAM0BMT)) *
* ACTION(REPLACE) *
* LANGUAGE(COBOL) *
* QUOTE *
* INDVAR(YES) *
* ... IS THE DCLGEN COMMAND THAT MADE THE FOLLOWING STATEMENTS *
******************************************************************
EXEC SQL DECLARE MAKE_MODEL TABLE
( MAKE VARCHAR(20) NOT NULL,
MODEL VARCHAR(20) NOT NULL
) END-EXEC.
******************************************************************
* COBOL DECLARATION FOR TABLE MAKE_MODEL *
******************************************************************
01 DCLMAKE-MODEL.
10 MAKE.
49 MAKE-LEN PIC S9(4) USAGE COMP.
49 MAKE-TEXT PIC X(20).
10 MODEL.
49 MODEL-LEN PIC S9(4) USAGE COMP.
49 MODEL-TEXT PIC X(20).
******************************************************************
* INDICATOR VARIABLE STRUCTURE *
******************************************************************
01 IMAKE-MODEL.
10 INDSTRUC PIC S9(4) USAGE COMP OCCURS 2 TIMES.
******************************************************************
* THE NUMBER OF COLUMNS DESCRIBED BY THIS DECLARATION IS 2 *
****************************************************************** | 81.966102 | 81 | 0.290116 |
a24d12ad78bf20c7af8acccf7748c7c8fb796bbe | 15,570 | cbl | COBOL | HCAZ_Source/IBMUSER.ZMOBILE.COBOL/HCMRESTW.cbl | kant/summit-health-apis | 4f26085eb9a80b050910358eb97ab7f0ebdb93c3 | [
"Apache-2.0"
] | null | null | null | HCAZ_Source/IBMUSER.ZMOBILE.COBOL/HCMRESTW.cbl | kant/summit-health-apis | 4f26085eb9a80b050910358eb97ab7f0ebdb93c3 | [
"Apache-2.0"
] | null | null | null | HCAZ_Source/IBMUSER.ZMOBILE.COBOL/HCMRESTW.cbl | kant/summit-health-apis | 4f26085eb9a80b050910358eb97ab7f0ebdb93c3 | [
"Apache-2.0"
] | null | null | null | ******************************************************************
* *
* LICENSED MATERIALS - PROPERTY OF IBM *
* *
* "RESTRICTED MATERIALS OF IBM" *
* *
* CB12 *
* *
* (C) COPYRIGHT IBM CORP. 2011, 2013 ALL RIGHTS RESERVED *
* *
* US GOVERNMENT USERS RESTRICTED RIGHTS - USE, DUPLICATION, *
* OR DISCLOSURE RESTRICTED BY GSA ADP SCHEDULE *
* CONTRACT WITH IBM CORPORATION *
* *
* *
******************************************************************
IDENTIFICATION DIVISION.
PROGRAM-ID. HCMRESTW.
ENVIRONMENT DIVISION.
CONFIGURATION SECTION.
*
DATA DIVISION.
WORKING-STORAGE SECTION.
*****************************************************************
* DFHJS2WS GENERATED COPYBOOKS
*****************************************************************
01 JSON-REST-DATA.
COPY HCMRST01.
01 HCPAPP-PATIENT-DETAILS.
* COPY HCCMAREA.
COPY HCCMARE2.
01 DEFAULT-CHANNEL PIC X(16).
01 WS-TSQ-FIELDS.
03 WS-TSQ-NAME PIC X(8) VALUE 'HCMRESTW'.
03 WS-TSQ-LEN PIC S9(4) COMP VALUE +200.
03 WS-TSQ-DATA PIC X(200).
01 WS-RETURN-RESPONSE PIC X(100).
01 WS-HTTP-METHOD PIC X(8).
01 WS-RESID PIC X(100).
01 WS-RESID2 PIC X(100).
* Fields to be used to calculate if commarea is large enough
01 WS-COMMAREA-LENGTHS.
03 WS-CA-HEADERTRAILER-LEN PIC S9(4) COMP VALUE +18.
03 WS-REQUIRED-CA-LEN PIC S9(4) VALUE +0.
03 WS-COUNTER PIC S9(4) VALUE +0.
03 LOCATION PIC S9(4) VALUE +0.
* Fields for URI manipulation
77 WS-FIELD1 PIC X(10).
77 WS-FIELD2 PIC X(3).
77 WS-FIELD3 PIC X(3).
77 WS-FIELD4 PIC X(30).
77 WS-FIELD5 PIC X(30).
77 RESP PIC S9(8) COMP-5 SYNC.
77 RESP2 PIC S9(8) COMP-5 SYNC.
* Container values
77 UNEXPECTED-RESP-ABCODE PIC X(04) VALUE 'ERRS'.
77 UNSUPPORTED-METHOD-ABCODE PIC X(04) VALUE 'UMET'.
* Method constants
77 METHOD-GET PIC X(8) VALUE 'GET '.
77 METHOD-PUT PIC X(8) VALUE 'PUT '.
77 METHOD-POST PIC X(8) VALUE 'POST '.
*77 METHOD-DELETE PIC X(8) VALUE 'DELETE '.
*77 METHOD-HEAD PIC X(8) VALUE 'HEAD '.
*****************************************************************
* Externally referenced data areas
*****************************************************************
LINKAGE SECTION.
*
*****************************************************************
* Main program code follows
*****************************************************************
PROCEDURE DIVISION.
MAIN-PROCESSING SECTION.
PERFORM INITIALISE-TEST.
PERFORM RETRIEVE-METHOD.
PERFORM PROCESS-METHOD.
EXEC CICS RETURN
RESP(RESP)
RESP2(RESP2)
END-EXEC.
IF RESP NOT = DFHRESP(NORMAL)
THEN
PERFORM GENERIC-ABEND
END-IF.
GOBACK.
*****************************************************************
* Initialise any variables and retrieve any test-specific
* configuration information
*****************************************************************
INITIALISE-TEST.
* INITIALIZE HCPAPP-PATIENT-DETAILS
MOVE SPACES to CA-REQUEST-ID
MOVE ZEROES to CA-RETURN-CODE
MOVE ZEROES TO CA-PATIENT-ID
MOVE ZEROES to CA-NUM-MEDICATIONS
MOVE ' ' TO WS-RETURN-RESPONSE
* get channel
EXEC CICS ASSIGN
CHANNEL(DEFAULT-CHANNEL)
RESP(RESP)
RESP2(RESP2)
END-EXEC
IF RESP NOT = DFHRESP(NORMAL)
THEN
EXEC CICS ABEND
ABCODE('CHAB')
END-EXEC
END-IF.
*****************************************************************
* Retrieve the content of the method container
*****************************************************************
RETRIEVE-METHOD.
EXEC CICS GET CONTAINER('DFHHTTPMETHOD')
INTO(WS-HTTP-METHOD)
RESP(RESP)
RESP2(RESP2)
END-EXEC
IF RESP NOT = DFHRESP(NORMAL)
THEN
EXEC CICS ABEND
ABCODE('MEAB')
END-EXEC
END-IF.
*****************************************************************
* Perform the method
*****************************************************************
PROCESS-METHOD.
EVALUATE WS-HTTP-METHOD
WHEN METHOD-GET
PERFORM GET-DATA
WHEN METHOD-PUT
PERFORM PUT-DATA
WHEN METHOD-POST
PERFORM POST-DATA
WHEN OTHER
EXEC CICS ABEND
ABCODE(UNSUPPORTED-METHOD-ABCODE)
END-EXEC
END-EVALUATE.
*****************************************************************
* Perform the GET method (READ)
*****************************************************************
get-data.
DISPLAY ' '.
DISPLAY 'Perform GET method.'
PERFORM GET-RESID
MOVE '01IMED' TO CA-REQUEST-ID
MOVE WS-FIELD1 TO CA-PATIENT-ID
Move 0 To CA-NUM-MEDICATIONS
EXEC CICS LINK PROGRAM('HCM1BI01')
COMMAREA(HCPAPP-PATIENT-DETAILS)
LENGTH(32500)
END-EXEC
MOVE CA-PATIENT-ID TO patient-id
MOVE CA-NUM-MEDICATIONS TO medications2-num
IF CA-NUM-MEDICATIONS > 0
MOVE ZERO To ws-counter
PERFORM CA-NUM-MEDICATIONS TIMES
ADD +1 to ws-counter
MOVE CA-MEDICATION-ID(ws-counter)
TO medication-id(ws-counter)
MOVE CA-DRUG-NAME(ws-counter) TO name(ws-counter)
MOVE CA-STRENGTH(ws-counter) TO strength(ws-counter)
MOVE CA-AMOUNT(ws-counter) TO amount(ws-counter)
MOVE CA-ROUTE(ws-counter) TO route(ws-counter)
MOVE CA-FREQUENCY(ws-counter) TO frequency(ws-counter)
MOVE CA-IDENTIFIER(ws-counter) TO
identifier(ws-counter)
MOVE CA-TYPE(ws-counter) TO biomed-type(ws-counter)
END-PERFORM
MOVE HCPAPP-PATIENT-DETAILS(1:200) TO WS-TSQ-DATA
PERFORM WRITE-TSQ
PERFORM PUT-RESPONSE-ROOT-DATA.
*****************************************************************
* Perform the POST method (CREATE)
*****************************************************************
post-data.
DISPLAY ' '.
DISPLAY 'Performing POST method.'
PERFORM GET-RESID
PERFORM GET-REQUEST-ROOT-DATA
MOVE '01AMED' TO CA-REQUEST-ID
MOVE ZEROES TO CA-PATIENT-ID
MOVE medication-id(ws-counter)
TO CA-MEDICATION-ID(ws-counter)
MOVE name (ws-counter) TO CA-DRUG-NAME(ws-counter)
MOVE strength(ws-counter) TO CA-STRENGTH(ws-counter)
MOVE amount (ws-counter) TO CA-AMOUNT(ws-counter)
MOVE route(ws-counter) TO CA-ROUTE(ws-counter)
MOVE frequency (ws-counter) TO CA-FREQUENCY(ws-counter)
MOVE identifier(ws-counter) TO CA-IDENTIFIER(ws-counter)
MOVE biomed-type(ws-counter) TO CA-TYPE(ws-counter)
EXEC CICS LINK PROGRAM('HCM1BA01')
COMMAREA(HCPAPP-PATIENT-DETAILS)
LENGTH(32500)
END-EXEC
MOVE CA-PATIENT-ID TO patient-id
STRING WS-FIELD4 patient-id
DELIMITED BY SPACE
INTO WS-RETURN-RESPONSE
EXEC CICS PUT
CONTAINER('DFHRESPONSE')
CHAR
FROM (WS-RETURN-RESPONSE)
RESP(RESP)
RESP2(RESP2)
END-EXEC
IF RESP NOT = DFHRESP(NORMAL)
THEN
EXEC CICS ABEND
ABCODE('POSA')
END-EXEC
END-IF
MOVE HCPAPP-PATIENT-DETAILS(1:200) TO WS-TSQ-DATA
PERFORM WRITE-TSQ.
*****************************************************************
* Perform the PUT method (UPDATE)
*****************************************************************
put-data.
DISPLAY ' '.
DISPLAY 'Performing PUT method.'
PERFORM GET-RESID
PERFORM GET-REQUEST-ROOT-DATA
MOVE '01UMED' TO CA-REQUEST-ID
MOVE WS-FIELD1 TO CA-PATIENT-ID
MOVE medication-id(ws-counter)
TO CA-MEDICATION-ID(ws-counter)
MOVE name(ws-counter) TO CA-DRUG-NAME(ws-counter)
MOVE strength(ws-counter) TO CA-STRENGTH(ws-counter)
MOVE amount(ws-counter) TO CA-AMOUNT(ws-counter)
MOVE route (ws-counter) TO CA-ROUTE(ws-counter)
MOVE frequency(ws-counter) TO CA-FREQUENCY(ws-counter)
MOVE identifier(ws-counter) TO CA-IDENTIFIER(ws-counter)
MOVE biomed-type(ws-counter) TO CA-TYPE(ws-counter)
EXEC CICS LINK PROGRAM('HCM1BU01')
COMMAREA(HCPAPP-PATIENT-DETAILS)
LENGTH(32500)
END-EXEC
MOVE CA-PATIENT-ID TO patient-id
STRING WS-FIELD4 patient-id
DELIMITED BY SPACE
INTO WS-RETURN-RESPONSE
EXEC CICS PUT
CONTAINER('DFHRESPONSE')
CHAR
FROM (WS-RETURN-RESPONSE)
RESP(RESP)
RESP2(RESP2)
END-EXEC
IF RESP NOT = DFHRESP(NORMAL)
THEN
EXEC CICS ABEND
ABCODE('PUTA')
END-EXEC
END-IF
MOVE HCPAPP-PATIENT-DETAILS(1:200) TO WS-TSQ-DATA
PERFORM WRITE-TSQ.
*****************************************************************
* Retrieve the content of the root container of the request tree
*****************************************************************
GET-REQUEST-ROOT-DATA.
EXEC CICS GET CONTAINER('DFHWS-DATA')
INTO(JSON-REST-DATA)
RESP(RESP)
RESP2(RESP2)
END-EXEC.
IF RESP NOT = DFHRESP(NORMAL)
THEN
PERFORM GENERIC-ABEND
END-IF.
*****************************************************************
* Return a copy of root data
*****************************************************************
PUT-RESPONSE-ROOT-DATA.
EXEC CICS PUT
CONTAINER('DFHWS-DATA')
FROM (JSON-REST-DATA)
RESP(RESP)
RESP2(RESP2)
END-EXEC.
IF RESP NOT = DFHRESP(NORMAL)
THEN
PERFORM GENERIC-ABEND
END-IF.
*****************************************************************
* Get containers
*****************************************************************
GET-RESID.
MOVE ' ' TO WS-RESID
EXEC CICS GET CONTAINER('DFHWS-URIMAPPATH')
INTO(WS-RESID)
RESP(RESP)
RESP2(RESP2)
END-EXEC
IF RESP NOT = DFHRESP(NORMAL) THEN
DISPLAY 'Cannot get URIMAP container.'
ELSE
UNSTRING WS-RESID DELIMITED BY '/'
INTO WS-FIELD1, WS-FIELD2, WS-FIELD3
DISPLAY 'URIMAP in WS-resid is:' WS-RESID
MOVE WS-RESID TO WS-RESID2
UNSTRING WS-RESID2 DELIMITED BY '*'
INTO WS-FIELD4, WS-FIELD5
END-IF
*
MOVE ' ' TO WS-RESID
EXEC CICS GET CONTAINER('DFHWS-URI-QUERY')
INTO(WS-RESID)
RESP(RESP)
RESP2(RESP2)
END-EXEC
IF RESP NOT = DFHRESP(NORMAL) THEN
DISPLAY 'Cannot get QUERY container.'
ELSE
DISPLAY 'QUERY in WS-RESID is:' WS-RESID
END-IF
*
MOVE ' ' TO WS-RESID
EXEC CICS GET CONTAINER('DFHWS-URI-RESID')
INTO(WS-RESID)
RESP(RESP)
RESP2(RESP2)
END-EXEC
IF RESP NOT = DFHRESP(NORMAL)
THEN
EXEC CICS ABEND
ABCODE('RESA')
END-EXEC
ELSE
DISPLAY 'RESID container is ' WS-resid
MOVE ' ' TO WS-FIELD1 WS-FIELD2 WS-FIELD3
UNSTRING WS-RESID DELIMITED BY '/'
INTO WS-FIELD1, WS-FIELD2, WS-FIELD3
DISPLAY 'After unstring, WS-FIELD1 is: ' WS-FIELD1
END-IF.
*****************************************************************
* Generic abend
*****************************************************************
GENERIC-ABEND.
EXEC CICS ABEND
ABCODE(UNEXPECTED-RESP-ABCODE)
END-EXEC.
*****************************************************************
* Write to TSQ
*****************************************************************
WRITE-TSQ.
EXEC CICS WRITEQ TS QUEUE(WS-TSQ-NAME)
FROM(WS-TSQ-DATA)
RESP(RESP)
NOSUSPEND
LENGTH(WS-TSQ-LEN)
END-EXEC. | 37.791262 | 73 | 0.383494 |
23d60766949b04fbf62c383ab0a9208904f27cc2 | 1,555 | cbl | COBOL | project/src/find-credits.cbl | Jaikido007/makersbbs-tmct | 6673a791e97ed694d21e9642c4b9c9ca64439219 | [
"RSA-MD"
] | null | null | null | project/src/find-credits.cbl | Jaikido007/makersbbs-tmct | 6673a791e97ed694d21e9642c4b9c9ca64439219 | [
"RSA-MD"
] | null | null | null | project/src/find-credits.cbl | Jaikido007/makersbbs-tmct | 6673a791e97ed694d21e9642c4b9c9ca64439219 | [
"RSA-MD"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. find-credits.
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT F-USERS-FILE ASSIGN TO "users.dat"
ORGANIZATION IS LINE SEQUENTIAL.
DATA DIVISION.
FILE SECTION.
FD F-USERS-FILE.
01 USERS.
05 USERNAME PIC X(16).
05 USER-PASSWORD PIC X(20).
05 USER-CREDITS PIC 9(3).
05 USER-LEVEL PIC X(3).
05 CARD-NO PIC 9(16).
05 CARD-EXPIRY PIC 9(4).
05 CARD-CSV PIC 9(3).
WORKING-STORAGE SECTION.
01 WS-FOUND PIC 9.
01 WS-IDX UNSIGNED-INT.
01 WS-FILE-IS-ENDED PIC 9.
01 COUNTER UNSIGNED-INT.
01 WS-CHECK-USERNAME PIC X(16).
01 WS-CHECK-CREDITS PIC 9(3).
LINKAGE SECTION.
01 LS-USERNAME PIC X(16).
01 LS-USERCREDITS PIC 9(3).
PROCEDURE DIVISION USING LS-USERNAME, LS-USERCREDITS.
SET WS-FILE-IS-ENDED TO 0.
SET COUNTER TO 0.
OPEN INPUT F-USERS-FILE.
PERFORM UNTIL WS-FILE-IS-ENDED = 1
READ F-USERS-FILE
NOT AT END
IF USERNAME = LS-USERNAME
MOVE USER-CREDITS TO LS-USERCREDITS
AT END
MOVE 1 TO WS-FILE-IS-ENDED
END-READ
END-PERFORM.
CLOSE F-USERS-FILE.
| 30.490196 | 60 | 0.4791 |
acc0d37a8cc595c5193ab47f5a00422bed751620 | 1,539 | cpy | COBOL | HospitalAppDemo/copybook/SQLCA.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | HospitalAppDemo/copybook/SQLCA.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | HospitalAppDemo/copybook/SQLCA.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | 01 SQLCA.
03 SQLCAID PIC X(8).
03 SQLCABC PIC S9(9) COMP.
03 SQLCODE PIC S9(9) COMP.
03 SQLERRM.
49 SQLERRML PIC S9(4) COMP.
49 SQLERRMC PIC X(70).
03 SQLERRP PIC X(8).
03 SQLERRD OCCURS 6 PIC S9(9) COMP.
03 SQLWARN.
05 SQLWARN0 PIC X.
05 SQLWARN1 PIC X.
05 SQLWARN2 PIC X.
05 SQLWARN3 PIC X.
05 SQLWARN4 PIC X.
05 SQLWARN5 PIC X.
05 SQLWARN6 PIC X.
05 SQLWARN7 PIC X.
03 SQLEXT PIC X(8).
| 76.95 | 80 | 0.180637 |
27e949fec1f0cd6dfcc6d14a09d27189cd2f6a1d | 2,106 | cpy | COBOL | HospitalAppDemo/copybook/HOSPBED.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | HospitalAppDemo/copybook/HOSPBED.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | HospitalAppDemo/copybook/HOSPBED.cpy | anuprakashm/HospitalAppDemo | 1eeb7a5e42821b9c7328224847a826833c7b025d | [
"Apache-2.0"
] | null | null | null | ******************************************************************
* DCLGEN TABLE(DDS0001.HOSP_BED) *
* LIBRARY(DDS0001.TEST.COPYLIB(HOSPBED)) *
* ACTION(REPLACE) *
* LANGUAGE(COBOL) *
* QUOTE *
* DBCSDELIM(NO) *
* ... IS THE DCLGEN COMMAND THAT MADE THE FOLLOWING STATEMENTS *
******************************************************************
EXEC SQL DECLARE DDS0001.HOSP_BED TABLE
( BED_ID CHAR(4),
ROOM_ID CHAR(4),
WARD_ID CHAR(4),
SPECIAL_CHARGES DECIMAL(7, 2)
) END-EXEC.
******************************************************************
* COBOL DECLARATION FOR TABLE DDS0001.HOSP_BED *
******************************************************************
01 DCLHOSP-BED.
10 BED-ID PIC X(4).
10 ROOM-ID PIC X(4).
10 WARD-ID PIC X(4).
10 SPECIAL-CHARGES PIC S9(5)V9(2) USAGE COMP-3.
******************************************************************
* THE NUMBER OF COLUMNS DESCRIBED BY THIS DECLARATION IS 4 *
******************************************************************
| 78 | 80 | 0.198955 |
2b1e2775ca89496fd83972211c1c64ac9a864520 | 182 | cpy | COBOL | tests/theia_automation_lsp/test_files/cobol/.copybooks/zowe-profile-1/DATA.SET.PATH2/BOOK2N.cpy | grianbrcom/che-che4z-lsp-for-cobol | 9b7fa4dc6c670f311685949992d102b282fdfbc5 | [
"Apache-2.0"
] | null | null | null | tests/theia_automation_lsp/test_files/cobol/.copybooks/zowe-profile-1/DATA.SET.PATH2/BOOK2N.cpy | grianbrcom/che-che4z-lsp-for-cobol | 9b7fa4dc6c670f311685949992d102b282fdfbc5 | [
"Apache-2.0"
] | 1 | 2020-04-16T12:31:43.000Z | 2020-04-16T12:33:53.000Z | tests/theia_automation_lsp/test_files/cobol/.copybooks/zowe-profile-1/DATA.SET.PATH2/BOOK2N.cpy | grianbrcom/che-che4z-lsp-for-cobol | 9b7fa4dc6c670f311685949992d102b282fdfbc5 | [
"Apache-2.0"
] | null | null | null | * BOOK2 Test
01 BOOK1N-REC.
Data Division.
Working-Storage Section.
05 User-Phone-Mobile PIC 9(6).
* 06 User-Phone-Mobile1 PIC 9(6).
| 22.75 | 43 | 0.538462 |
d2bc21787df2bc53672e4478efd868ff5aba80a3 | 123 | cpy | COBOL | skins/alphaflow/instance_edit.cpy | gocept/alphaflow | 4b797cb12fb52254b1884159fd9a8b899c739f7c | [
"ZPL-2.1",
"ZPL-2.0"
] | null | null | null | skins/alphaflow/instance_edit.cpy | gocept/alphaflow | 4b797cb12fb52254b1884159fd9a8b899c739f7c | [
"ZPL-2.1",
"ZPL-2.0"
] | null | null | null | skins/alphaflow/instance_edit.cpy | gocept/alphaflow | 4b797cb12fb52254b1884159fd9a8b899c739f7c | [
"ZPL-2.1",
"ZPL-2.0"
] | 1 | 2021-11-01T07:58:18.000Z | 2021-11-01T07:58:18.000Z | instance = context.getInstance()
state = instance.content_edit()
instance.updateWorkitemsAndContentObjects()
return state
| 20.5 | 43 | 0.829268 |
fd53be9d993c545ece3d05bc90073c6013177202 | 490 | cbl | COBOL | src/test/resources/integration/initialize/programStartSimple.cbl | LoPoHa/cobol_truffle | a2be516ee60c56eea72ff4973029c9757c90bddf | [
"MIT"
] | 2 | 2020-08-09T16:51:53.000Z | 2021-01-30T15:02:50.000Z | src/test/resources/integration/initialize/programStartSimple.cbl | LoPoHa/cobol_truffle | a2be516ee60c56eea72ff4973029c9757c90bddf | [
"MIT"
] | 38 | 2020-06-26T13:02:35.000Z | 2020-09-06T13:28:30.000Z | src/test/resources/integration/initialize/programStartSimple.cbl | LoPoHa/cobol_truffle | a2be516ee60c56eea72ff4973029c9757c90bddf | [
"MIT"
] | 1 | 2020-06-24T13:15:25.000Z | 2020-06-24T13:15:25.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. SIMPLE.
*
ENVIRONMENT DIVISION.
*
DATA DIVISION.
WORKING-STORAGE SECTION.
01 STRING PIC X(4) VALUE "TEST".
01 NUMBER PIC 9(4) VALUE 1234.
*
PROCEDURE DIVISION.
*
MAIN SECTION.
*
DISPLAY STRING.
DISPLAY NUMBER.
*
PROG-EX.
EXIT PROGRAM.
*
END PROGRAM SIMPLE.
| 22.272727 | 62 | 0.44898 |
5ef7bbfb0aec8dc89ffc6cea017f3ca651c1182c | 437 | cbl | COBOL | hello.cbl | jharrison902/cobol-samples | 04d9a577aeccf539b45aa22cf43a527d0c31bdec | [
"MIT"
] | null | null | null | hello.cbl | jharrison902/cobol-samples | 04d9a577aeccf539b45aa22cf43a527d0c31bdec | [
"MIT"
] | null | null | null | hello.cbl | jharrison902/cobol-samples | 04d9a577aeccf539b45aa22cf43a527d0c31bdec | [
"MIT"
] | 1 | 2019-11-13T18:05:11.000Z | 2019-11-13T18:05:11.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. HELLO-WORLD.
*> hello, world
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 WS-NAME PIC X(15) VALUE 'World'.
PROCEDURE DIVISION.
0000-main-logic.
PERFORM 1000-get-name.
PERFORM 2000-display-name.
STOP RUN.
1000-get-name.
DISPLAY 'What is your name?'.
ACCEPT WS-NAME FROM CONSOLE.
2000-display-name.
DISPLAY 'Hello 'WS-NAME'!'.
| 20.809524 | 35 | 0.709382 |
5993b75909534d1da045c2742ec53d515ca5cfd3 | 875 | cobol | COBOL | Task/Call-a-foreign-language-function/COBOL/call-a-foreign-language-function.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Call-a-foreign-language-function/COBOL/call-a-foreign-language-function.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Call-a-foreign-language-function/COBOL/call-a-foreign-language-function.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | identification division.
program-id. foreign.
data division.
working-storage section.
01 hello.
05 value z"Hello, world".
01 duplicate usage pointer.
01 buffer pic x(16) based.
01 storage pic x(16).
procedure division.
call "strdup" using hello returning duplicate
on exception
display "error calling strdup" upon syserr
end-call
if duplicate equal null then
display "strdup returned null" upon syserr
else
set address of buffer to duplicate
string buffer delimited by low-value into storage
display function trim(storage)
call "free" using by value duplicate
on exception
display "error calling free" upon syserr
end-if
goback.
| 31.25 | 60 | 0.577143 |
c0a6777fda7734e011bd9ee480e7c0ed3084b0c0 | 859 | cbl | COBOL | cobol/testdata/local/testantlr142.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 6 | 2020-06-18T08:47:41.000Z | 2021-12-06T05:54:07.000Z | cobol/testdata/local/testantlr142.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 3 | 2020-10-26T11:06:31.000Z | 2022-03-29T18:59:04.000Z | cobol/testdata/local/testantlr142.cbl | Trisk3lion/mapa | 19f47614f96dd0b14ff87fecc65e7bea082521ca | [
"MIT"
] | 5 | 2021-01-21T18:54:33.000Z | 2022-01-18T23:01:31.000Z | 000001 PROCESS DEFINE(X=2)
000002 Identification Division.
000003 Program-ID. testantlr142.
000004 Data Division.
000005 Working-Storage Section.
000006
000007 01 CONSTANTS.
000008 05 MYNAME PIC X(012) VALUE 'testantlr142'.
000009 >>EVALUATE TRUE
000010 >>WHEN X = 1
000011 05 PGM-0001 PIC X(008) VALUE 'PGMA0001'.
000012 >>WHEN X = 2
000013 05 PGM-0001 PIC X(008) VALUE 'PGMA0002'.
000014 >>WHEN X = 3
000015 05 PGM-0001 PIC X(008) VALUE 'PGMA0003'.
000016 >>WHEN OTHER
000017 05 PGM-0001 PIC X(008) VALUE 'PGMA0009'.
000018 >>END-EVALUATE
000019
000020*
000021
000022 Procedure Division.
000023 DISPLAY MYNAME ' Begin'
000024 CALL PGM-0001
000025
000026 DISPLAY MYNAME ' End'
000027
000028 GOBACK
000029 .
000030
000031
| 26.84375 | 68 | 0.644936 |
390311d8b347bca455baec537c769cbc08e04396 | 971 | cbl | COBOL | test/fixtures/cobol/comment.cbl | OCRenkist/vscode-explicit-folding | 5d8d6840a3d669707e973aed6ee38c566aa6e70f | [
"MIT"
] | 53 | 2018-07-19T03:07:25.000Z | 2022-03-21T11:37:28.000Z | test/fixtures/cobol/comment.cbl | OCRenkist/vscode-explicit-folding | 5d8d6840a3d669707e973aed6ee38c566aa6e70f | [
"MIT"
] | 65 | 2018-07-18T22:06:49.000Z | 2022-03-15T03:03:25.000Z | test/fixtures/cobol/comment.cbl | OCRenkist/vscode-explicit-folding | 5d8d6840a3d669707e973aed6ee38c566aa6e70f | [
"MIT"
] | 9 | 2018-08-13T17:41:29.000Z | 2022-01-29T03:40:15.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. MYPROG.
DATE-COMPILED.
ENVIRONMENT DIVISION.
CONFIGURATION SECTION.
SOURCE-COMPUTER. IBM-370.
OBJECT-COMPUTER. IBM-370.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
select DD-FICHIER assign to UT-S-DD.
DATA DIVISION.
FILE SECTION.
FD DD-FICHIER
block contains 0 records
recording mode is F.
copy DDCOPY.
WORKING-STORAGE SECTION.
01 ADATA PIC X(1).
LINKAGE SECTION.
01 APARM PIC X(10).
PROCEDURE DIVISION using APARM.
* comment 1
* comment 2
* comment 3
* comment 4
* comment 5
* comment 6
* comment 7
* comment 8
* comment 9
* comment 10
* comment 11
* comment 12
MAIN SECTION.
START-OF-RUN.
display "Hello World !"
.
END-OF-RUN.
goback.
| 24.275 | 48 | 0.519053 |
d9802330b814d12ae2bca15159b3b08905af8a65 | 1,762 | cbl | COBOL | COBOL/mf/test/TestGildedRose.cbl | yangyangisyou/GildedRose-Refactoring-Kata | 28443f97b267e5c204aa9c2f6b27b2f141e5975e | [
"MIT"
] | 2,201 | 2015-01-03T03:36:52.000Z | 2022-03-31T14:09:42.000Z | COBOL/mf/test/TestGildedRose.cbl | yangyangisyou/GildedRose-Refactoring-Kata | 28443f97b267e5c204aa9c2f6b27b2f141e5975e | [
"MIT"
] | 191 | 2015-01-28T14:48:07.000Z | 2022-03-17T07:47:21.000Z | COBOL/mf/test/TestGildedRose.cbl | yangyangisyou/GildedRose-Refactoring-Kata | 28443f97b267e5c204aa9c2f6b27b2f141e5975e | [
"MIT"
] | 3,673 | 2015-01-03T11:05:29.000Z | 2022-03-31T15:40:14.000Z | *> Test Fixture for GildedRose, GildedRose
copy "mfunit_prototypes.cpy".
program-id. TestGildedRose.
file-control.
select in-items assign 'in-items'.
select items assign 'items'.
file section.
fd in-items.
01 in-item.
02 sell-in pic 9(4).
02 quality pic 9(4).
02 name pic x(50).
fd items.
01 item.
02 sell-in pic 9(4).
02 quality pic 9(4).
02 name pic x(50).
working-storage section.
copy "mfunit.cpy".
78 TEST-TESTGILDEDROSE value "TestGildedRose".
01 pp procedure-pointer.
*> Program linkage data
procedure division.
goback returning 0
.
entry MFU-TC-PREFIX & TEST-TESTGILDEDROSE.
open output in-items
move "foo" to name in in-item
move 0 to quality in in-item
move 0 to sell-in in in-item
write in-item
close in-items
call "GildedRose"
open input items
read items
if name in item not equal to "fixme" then
call MFU-ASSERT-FAIL-Z using z"item name was not fixme"
close items
goback
.
$region TestCase Configuration
entry MFU-TC-SETUP-PREFIX & TEST-TESTGILDEDROSE.
perform InitializeLinkageData
*> Add any other test setup code here
goback returning 0
.
InitializeLinkageData section.
*> Load the library that is being tested
set pp to entry "GildedRose"
exit section
.
$end-region
end program.
| 25.911765 | 70 | 0.520431 |
d8d8aeee2344fdd6613ddcec6d2e7a283bcd5394 | 6,449 | cbl | COBOL | samples/MortgageApplication/cobol/CBSRGDBB.cbl | Uma-teli/pooja | 39efb958c5883cba1f18be4fc1c392ba04b9f9b2 | [
"Apache-2.0"
] | null | null | null | samples/MortgageApplication/cobol/CBSRGDBB.cbl | Uma-teli/pooja | 39efb958c5883cba1f18be4fc1c392ba04b9f9b2 | [
"Apache-2.0"
] | null | null | null | samples/MortgageApplication/cobol/CBSRGDBB.cbl | Uma-teli/pooja | 39efb958c5883cba1f18be4fc1c392ba04b9f9b2 | [
"Apache-2.0"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. CBSRGDBB.
ENVIRONMENT DIVISION.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 WS-ACCOUNT-NO-T PIC S9(18).
01 WS-ACCOUNT-NAME PIC X(50).
01 WS-PRINT PIC X(21) VALUE 'IS ALREADY REGISTERED'.
01 WS-ACCOUNT-NAME1 PIC X(50).
01 WS-PRINT1 PIC X(23) VALUE 'REGISTRED SUCESSFUL123'.
** 01 WS-PRINT1 PIC X(23) VALUE 'YOU ARE REGISTRED Ravi'.
01 WS-ACCOUNT-STATUS PIC X(10).
01 WS-MESSAGE PIC X(100).
01 WS-MESSAGE1 PIC X(100).
EXEC SQL
INCLUDE CBSMST
END-EXEC.
EXEC SQL
INCLUDE SQLCA
END-EXEC.
* COPY REGREQ.
* COPY REGRES.
* 77 MESSAGES PIC X(35).
LINKAGE SECTION.
01 DFHCOMMAREA.
02 CSRGREQ.
COPY CSRGREQ.
02 CSRGRES REDEFINES CSRGREQ.
COPY CSRGRES.
* 05 LS-ACCOUNT-NO PIC S9(18).
* 05 LS-MESSAGES REDEFINES LS-ACCOUNT-NO PIC X(100).
* 05 MESSAGES-DATA PIC X(500).
* 05 WS-INPUT
* 05 WS-OUTPUT.
* COPY RESCPY.
* PROCESS STARTCMTADDCY
PROCEDURE DIVISION.
MOVE LOW-VALUES TO DCLCBS-ACCT-MSTR-DTL.
MOVE ACCOUNT-NO TO WS-ACCOUNT-NO-T.
MOVE SPACE TO CUSTOMER-NAME.
MOVE SPACE TO SYS-DATE.
MOVE SPACE TO SYS-TIME.
COMPUTE CUSTOMER-ID = 0.
PERFORM ACCT-VALID THRU ACCT-VALID-EXIT.
* MOVE SPACES TO LS-MESSAGES.
* MOVE MESSAGES TO LS-MESSAGES.
EXEC CICS RETURN END-EXEC.
ACCT-VALID.
* MOVE LOW-VALUES TO WS-ACCOUNT-NO.
* MOVE LS-ACCOUNT-NO TO WS-ACCOUNT-NO.
* MOVE WS-ACCOUNT-NO TO H1-ACCOUNT-NUMBER.
COMPUTE H1-ACCOUNT-NUMBER = WS-ACCOUNT-NO-T
DISPLAY "ACCT NO. FROM INPUT" H1-ACCOUNT-NUMBER
EXEC SQL
SELECT CURRENT TIME INTO :H1-ACCOUNT-STATUS FROM
SYSIBM.SYSDUMMY1
END-EXEC
MOVE H1-ACCOUNT-STATUS TO SYS-TIME
DISPLAY 'TIME'SYS-TIME
EXEC SQL
SELECT CURRENT DATE INTO :H1-ACCOUNT-STATUS FROM
SYSIBM.SYSDUMMY1
END-EXEC
MOVE H1-ACCOUNT-STATUS TO SYS-DATE
DISPLAY 'DATE'SYS-DATE
EXEC SQL
SELECT * INTO :DCLCBS-ACCT-MSTR-DTL
* ACCOUNT_NUMBER, ACCOUNT_STATUS, UPD_USERID, CUSTOMER_ID
* INTO
* :H1-ACCOUNT-NUMBER, :H1-ACCOUNT-STATUS, :H1-UPD-USERID,
* :H1-CUSTOMER-ID
FROM CBS_ACCT_MSTR_DTL
WHERE ACCOUNT_NUMBER=:H1-ACCOUNT-NUMBER
END-EXEC
MOVE LOW-VALUES TO WS-MESSAGE
MOVE H1-ACCOUNT-NAME TO WS-ACCOUNT-NAME
STRING WS-ACCOUNT-NAME DELIMITED BY SPACE
' ' DELIMITED BY SIZE
WS-PRINT DELIMITED BY SIZE
INTO WS-MESSAGE
MOVE LOW-VALUES TO WS-MESSAGE1
MOVE H1-ACCOUNT-NAME TO WS-ACCOUNT-NAME1
STRING WS-ACCOUNT-NAME1 DELIMITED BY SPACE
' ' DELIMITED BY SIZE
WS-PRINT1 DELIMITED BY SIZE
INTO WS-MESSAGE1
** MOVE WS-PRINT1 TO WS-MESSAGE1
DISPLAY "MESS" WS-MESSAGE
DISPLAY "NAME" WS-ACCOUNT-NAME
DISPLAY "SQLCODE:" SQLCODE
EVALUATE SQLCODE
WHEN 0
DISPLAY H1-ACCOUNT-NUMBER
DISPLAY H1-UPD-USERID
DISPLAY H1-ACCOUNT-STATUS
DISPLAY H1-CUSTOMER-ID
DISPLAY H1-PRODUCT-CODE
DISPLAY 'ACCOUNT IS AVAILABLE'
MOVE "SUCCESSFUL" TO MESSAGES
MOVE H1-ACCOUNT-NAME TO CUSTOMER-NAME
COMPUTE CUSTOMER-ID = H1-CUSTOMER-ID
PERFORM ACCT-STATUS THRU ACCT-STATUS-EXIT
DISPLAY 'MESSAGES:'
WHEN 100
MOVE "ACCOUNT DOES NOT EXIT WITH BANK" TO MESSAGES
DISPLAY "MESSAGES:" MESSAGES
EXEC CICS RETURN END-EXEC
WHEN OTHER
DISPLAY "SQLCODE1:" SQLCODE
MOVE "SQL ERROR" TO MESSAGES
DISPLAY "MESSAGES:" MESSAGES
EXEC CICS RETURN END-EXEC
END-EVALUATE.
ACCT-VALID-EXIT.
EXIT.
ACCT-STATUS.
EXEC SQL
SELECT
ACCOUNT_STATUS
INTO
:H1-ACCOUNT-STATUS
FROM CBS_ACCT_MSTR_DTL
WHERE ACCOUNT_NUMBER=:H1-ACCOUNT-NUMBER
END-EXEC.
EVALUATE SQLCODE
WHEN 0
DISPLAY H1-ACCOUNT-STATUS(1:6)
MOVE H1-ACCOUNT-STATUS TO WS-ACCOUNT-STATUS
DISPLAY WS-ACCOUNT-STATUS
DISPLAY 'ACCOUNT STATUS IS FETCHED'
MOVE "SUCCESSFUL" TO MESSAGES
DISPLAY "MESSAGES:" MESSAGES
PERFORM CHECK-ACCT-STATUS THRU CHECK-ACCT-STATUS-EXIT
WHEN 100
MOVE "NO RECORD FOUND" TO MESSAGES
DISPLAY "MESSAGES:" MESSAGES
EXEC CICS RETURN END-EXEC
WHEN OTHER
DISPLAY "SQLCODE2:" SQLCODE
MOVE "SQL ERROR" TO MESSAGES
DISPLAY "MESSAGES:" MESSAGES
EXEC CICS RETURN END-EXEC
END-EVALUATE.
ACCT-STATUS-EXIT.
EXIT.
CHECK-ACCT-STATUS.
DISPLAY 'CHECK STATUS PARA'
EVALUATE WS-ACCOUNT-STATUS
WHEN 'ACTIVE '
DISPLAY 'ALREADY REGISTERED'
MOVE WS-MESSAGE TO MESSAGES
EXEC CICS RETURN END-EXEC
WHEN 'INACTIVE '
MOVE 'REGISTRATION STARTING' TO MESSAGES
PERFORM REG-ACCT-STATS THRU REG-ACCT-STATS-EXIT
WHEN 'OTHER'
DISPLAY 'NOT Y OR N'
MOVE 'PLEASE CONTACT BANK' TO MESSAGES
EXEC CICS RETURN END-EXEC
END-EVALUATE.
CHECK-ACCT-STATUS-EXIT.
EXIT.
REG-ACCT-STATS.
DISPLAY 'REGISTER PARA'
EXEC SQL UPDATE CBS_ACCT_MSTR_DTL
SET ACCOUNT_STATUS ='ACTIVE ',
UPD_USERID ='NAGARAJPK '
WHERE ACCOUNT_NUMBER = :H1-ACCOUNT-NUMBER
END-EXEC.
DISPLAY SQLCODE
MOVE WS-MESSAGE1 TO MESSAGES.
** MOVE "CUSTOMER REGISTERED SUCESSFULLY" TO MESSAGES.
REG-ACCT-STATS-EXIT.
EXIT. | 35.629834 | 67 | 0.539929 |
a86f59ab8f7739c3091f6c2917ff8883a9e3eea4 | 2,652 | cbl | COBOL | WebAPIWPFClient/Properties/Resources.Designer.cbl | cobol-cloud/vs-demo | 0b402576b64475b7598d2312d3f653191a948d34 | [
"Apache-2.0"
] | null | null | null | WebAPIWPFClient/Properties/Resources.Designer.cbl | cobol-cloud/vs-demo | 0b402576b64475b7598d2312d3f653191a948d34 | [
"Apache-2.0"
] | null | null | null | WebAPIWPFClient/Properties/Resources.Designer.cbl | cobol-cloud/vs-demo | 0b402576b64475b7598d2312d3f653191a948d34 | [
"Apache-2.0"
] | null | null | null | *> Namespace: AmortWPFClient
*> This class was auto-generated by the StronglyTypedResourceBuilder
*> class via a tool like ResGen or Visual Studio.
*> To add or remove a member, edit your .ResX file then rerun ResGen
*> with the /str option, or rebuild your VS project.
*>> <summary>
*>> A strongly-typed resource class, for looking up localized strings, etc.
*>> </summary>
class-id AmortWPFClient.Properties.Resources
attribute System.CodeDom.Compiler.GeneratedCode("System.Resources.Tools.StronglyTypedResourceBuilder", "2.0.0.0")
attribute System.Diagnostics.DebuggerNonUserCode()
attribute System.Runtime.CompilerServices.CompilerGenerated()
.
working-storage section.
01 resourceMan type System.Resources.ResourceManager static.
01 resourceCulture type System.Globalization.CultureInfo static.
*> Returns the cached ResourceManager instance used by this class.
method-id get property ResourceManager static
attribute System.ComponentModel.EditorBrowsable(type System.ComponentModel.EditorBrowsableState::Advanced) final.
local-storage section.
01 temp type System.Resources.ResourceManager.
procedure division returning return-item as type System.Resources.ResourceManager.
if object::ReferenceEquals(resourceMan null) then
set temp to new System.Resources.ResourceManager( "AmortWPFClient.Resources" type of AmortWPFClient.Properties.Resources::Assembly)
set resourceMan to temp
end-if
set return-item to resourceMan
goback
end method.
*> Overrides the current thread's CurrentUICulture property for all
*> resource lookups using this strongly typed resource class.
method-id get property Culture static
attribute System.ComponentModel.EditorBrowsable(type System.ComponentModel.EditorBrowsableState::Advanced) final.
procedure division returning return-item as type System.Globalization.CultureInfo.
set return-item to resourceCulture
goback
end method.
method-id set property Culture static final.
procedure division using by value #value as type System.Globalization.CultureInfo.
set resourceCulture to #value
end method.
method-id NEW protected
attribute System.Diagnostics.CodeAnalysis.SuppressMessage("Microsoft.Performance", "CA1811:AvoidUncalledPrivateCode").
procedure division.
end method.
end class.
| 49.111111 | 143 | 0.695701 |
80dfb488f2c6693cba052de6a07440b68b0cf827 | 1,134 | cobol | COBOL | Task/Primality-by-trial-division/COBOL/primality-by-trial-division-1.cobol | djgoku/RosettaCodeData | 91df62d46142e921b3eacdb52b0316c39ee236bc | [
"Info-ZIP"
] | null | null | null | Task/Primality-by-trial-division/COBOL/primality-by-trial-division-1.cobol | djgoku/RosettaCodeData | 91df62d46142e921b3eacdb52b0316c39ee236bc | [
"Info-ZIP"
] | null | null | null | Task/Primality-by-trial-division/COBOL/primality-by-trial-division-1.cobol | djgoku/RosettaCodeData | 91df62d46142e921b3eacdb52b0316c39ee236bc | [
"Info-ZIP"
] | null | null | null | >>source format is free
identification division.
program-id. prime-div.
data division.
working-storage section.
*> The number for which we are testing primality.
01 num pic 9(6) value 1.
01 out-num pic z(6).
*> Division-related stuff.
01 div pic 9(6).
01 div-lim pic 9(6).
01 rem pic 9(6).
88 not-prime value 0.
procedure division.
main.
perform until num = 0
perform get-a-num
perform is-prime
move num to out-num
if not-prime
display out-num " is not prime."
else
display out-num " is prime."
end-if
end-perform
stop run
.
is-prime.
if num = 1
move 0 to rem
else if num < 4
move 1 to rem
else
compute div-lim = function sqrt(num) + 1
perform with test after varying div from 2 by 1
until (div = div-lim) or not-prime
compute rem = function mod(num, div)
end-perform
end-if
.
get-a-num.
display "Enter a possible prime number (0 to stop): " with no advancing
accept num
if num = 0
stop run
end-if
.
| 20.618182 | 75 | 0.575838 |
d2f9c0f8e12e2157aa38d9bc6e1fe4e48cc34737 | 1,873 | cbl | COBOL | project/src/transactions.cbl | Jaikido007/makersbbs-tmct | 6673a791e97ed694d21e9642c4b9c9ca64439219 | [
"RSA-MD"
] | null | null | null | project/src/transactions.cbl | Jaikido007/makersbbs-tmct | 6673a791e97ed694d21e9642c4b9c9ca64439219 | [
"RSA-MD"
] | null | null | null | project/src/transactions.cbl | Jaikido007/makersbbs-tmct | 6673a791e97ed694d21e9642c4b9c9ca64439219 | [
"RSA-MD"
] | null | null | null | IDENTIFICATION DIVISION.
PROGRAM-ID. transactions.
ENVIRONMENT DIVISION.
INPUT-OUTPUT SECTION.
FILE-CONTROL.
SELECT F-TRANSACTION-LOG-FILE ASSIGN TO "transaction-log.dat"
ORGANISATION IS LINE SEQUENTIAL.
DATA DIVISION.
FILE SECTION.
FD F-TRANSACTION-LOG-FILE.
01 TRANSACTION.
05 DY PIC X(2).
05 MTH PIC X(2).
05 YR PIC X(4).
05 USERNAME PIC X(16).
05 CHARGE PIC 9(2).
LINKAGE SECTION.
01 LS-FORMATTED-DT.
05 LS-FORMATTED-DTE-TME.
15 LS-FORMATTED-YEAR PIC X(4).
15 FILLER PIC X VALUE '-'.
15 LS-FORMATTED-MONTH PIC X(2).
15 FILLER PIC X VALUE '-'.
15 LS-FORMATTED-DY PIC X(2).
15 FILLER PIC X VALUE '-'.
15 LS-FORMATTED-HOUR PIC X(2).
15 FILLER PIC X VALUE ':'.
15 LS-FORMATTED-MINS PIC X(2).
15 FILLER PIC X VALUE ':'.
15 LS-FORMATTED-SEC PIC X(2).
15 FILLER PIC X VALUE ':'.
15 LS-FORMATTED-MS PIC X(2).
01 LS-USERNAME PIC X(16).
01 LS-STORE-CHARGE PIC 9(2).
PROCEDURE DIVISION USING LS-FORMATTED-DT, LS-USERNAME,
LS-STORE-CHARGE.
OPEN EXTEND F-TRANSACTION-LOG-FILE
MOVE LS-FORMATTED-DY TO DY
MOVE LS-FORMATTED-MONTH TO MTH
MOVE LS-FORMATTED-YEAR TO YR
MOVE LS-USERNAME TO USERNAME
MOVE LS-STORE-CHARGE TO CHARGE
WRITE TRANSACTION
END-WRITE
CLOSE F-TRANSACTION-LOG-FILE.
| 37.46 | 72 | 0.466631 |
5fa6d9bc8fb40b7f5206a8ccbf8ed829df90f7b9 | 1,270 | cobol | COBOL | 056_COBOL/fizzbuzz.cobol | your-diary/FizzBuzz_with_50_languages | 28afb39472418d8c3a5e65f598660432fc9970fb | [
"MIT"
] | null | null | null | 056_COBOL/fizzbuzz.cobol | your-diary/FizzBuzz_with_50_languages | 28afb39472418d8c3a5e65f598660432fc9970fb | [
"MIT"
] | null | null | null | 056_COBOL/fizzbuzz.cobol | your-diary/FizzBuzz_with_50_languages | 28afb39472418d8c3a5e65f598660432fc9970fb | [
"MIT"
] | null | null | null | 000010* This is a comment.
000020* A COBOL program consist of divisions and the identification division, which explains what this program is, shall come first.
000030
100000 IDENTIFICATION DIVISION.
100010 PROGRAM-ID. FIZZBUZZ.
100020
200000 DATA DIVISION.
200010 WORKING-STORAGE SECTION.
200011* `PIC 999` means it is an integer and can have at most three digits.
200020 01 COUNTER PIC 999 VALUE 0.
200030 01 IS_FIZZ PIC 9 VALUE 0.
200040 01 IS_BUZZ PIC 9 VALUE 0.
200050
300000 PROCEDURE DIVISION.
300010 PERFORM 100 TIMES
300020 ADD 1 TO COUNTER
300030 COMPUTE IS_FIZZ = FUNCTION MOD(COUNTER 3)
300040 COMPUTE IS_BUZZ = FUNCTION MOD(COUNTER 5)
300050 IF (IS_FIZZ = 0 AND IS_BUZZ = 0) THEN
300060 DISPLAY "FizzBuzz"
300070 ELSE IF (IS_FIZZ = 0) THEN
300080 DISPLAY "Fizz"
300090 ELSE IF (IS_BUZZ = 0) THEN
300100 DISPLAY "Buzz"
300110 ELSE
300111* /* Removes the trailing zeros. */
300112 IF (COUNTER < 10) THEN
300113 DISPLAY COUNTER (3:)
300115 ELSE
300117 DISPLAY COUNTER (2:)
300118 END-IF
300130 END-IF
300140 END-PERFORM.
300020 STOP RUN.
| 35.277778 | 132 | 0.641732 |
12e9e8ebe1e063d3723dd6bfedf8794b217fa85c | 529 | cbl | COBOL | src/test/resources/integration/call/simpleCall.cbl | LoPoHa/cobol_truffle | a2be516ee60c56eea72ff4973029c9757c90bddf | [
"MIT"
] | 2 | 2020-08-09T16:51:53.000Z | 2021-01-30T15:02:50.000Z | src/test/resources/integration/call/simpleCall.cbl | LoPoHa/cobol_truffle | a2be516ee60c56eea72ff4973029c9757c90bddf | [
"MIT"
] | 38 | 2020-06-26T13:02:35.000Z | 2020-09-06T13:28:30.000Z | src/test/resources/integration/call/simpleCall.cbl | LoPoHa/cobol_truffle | a2be516ee60c56eea72ff4973029c9757c90bddf | [
"MIT"
] | 1 | 2020-06-24T13:15:25.000Z | 2020-06-24T13:15:25.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. SIMPLECALL.
*
ENVIRONMENT DIVISION.
*
DATA DIVISION.
WORKING-STORAGE SECTION.
COPY BASICDEFINITIONS.
*
PROCEDURE DIVISION.
*
MAIN SECTION.
*
DISPLAY COPY-STRING.
DISPLAY COPY-NUMBER.
CALL SIMPLECALLED USING BASIC-DEFINITIONS.
DISPLAY COPY-STRING.
DISPLAY COPY-NUMBER.
*
PROG-EX.
EXIT PROGRAM.
*
END PROGRAM SIMPLECALL.
| 22.041667 | 52 | 0.534972 |
a2dad90da2d8ddc8d9518d750f8376f3cfbf1a68 | 383 | cpy | COBOL | ccb2lr/src/test/resources/simpleSigned.cpy | venkateshprasad123/wb | f685b1d30ebc0b9e36bb1113bfe05de01c5dba57 | [
"Apache-2.0"
] | 3 | 2021-09-29T01:20:11.000Z | 2022-01-12T00:31:31.000Z | ccb2lr/src/test/resources/simpleSigned.cpy | venkateshprasad123/wb | f685b1d30ebc0b9e36bb1113bfe05de01c5dba57 | [
"Apache-2.0"
] | 16 | 2021-09-27T01:23:47.000Z | 2022-03-25T18:32:46.000Z | ccb2lr/src/test/resources/simpleSigned.cpy | venkateshprasad123/wb | f685b1d30ebc0b9e36bb1113bfe05de01c5dba57 | [
"Apache-2.0"
] | 1 | 2022-01-12T00:27:08.000Z | 2022-01-12T00:27:08.000Z | 01 CUSTOMER-RECORD.
05 LAST-NAME PIC X(15).
05 FIRST-NAME PIC X(8).
05 STREET-ADDRESS PIC X(20).
05 CITY PIC X(17).
05 STATE PIC XX.
05 AMOUNT PIC S9(5).
05 UNSIGN PIC 9(5).
05 FILLER PIC X(10). | 42.555556 | 45 | 0.349869 |
25182d17bc1cd0876a915003c32c7044f1d24d86 | 792 | cobol | COBOL | Task/Terminal-control-Dimensions/COBOL/terminal-control-dimensions.cobol | LaudateCorpus1/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Terminal-control-Dimensions/COBOL/terminal-control-dimensions.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | null | null | null | Task/Terminal-control-Dimensions/COBOL/terminal-control-dimensions.cobol | seanwallawalla-forks/RosettaCodeData | 9ad63ea473a958506c041077f1d810c0c7c8c18d | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | IDENTIFICATION DIVISION.
PROGRAM-ID. terminal-dimensions.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 num-lines PIC 9(3).
01 num-cols PIC 9(3).
SCREEN SECTION.
01 display-screen.
03 LINE 01 COL 01 PIC 9(3) FROM num-lines.
03 LINE 01 COL 05 VALUE "rows by " .
03 LINE 01 COL 13 PIC 9(3) FROM num-cols.
03 LINE 01 COL 16 VALUE " columns.".
PROCEDURE DIVISION.
ACCEPT num-lines FROM LINES
ACCEPT num-cols FROM COLUMNS
DISPLAY display-screen
* This pauses the program, as ncurses will immediately revert
* back to the console when the program ends.
CALL "C$SLEEP" USING BY CONTENT 3
GOBACK
.
| 28.285714 | 70 | 0.563131 |
b22d16dad8320307326747022cc23ddf2305c263 | 977 | cob | COBOL | test/prog14.cob | msharov/cobcy | 1c2362eed77abf142d53e77de54ad1e757369f95 | [
"MIT"
] | 9 | 2016-06-28T00:57:49.000Z | 2021-10-05T17:50:52.000Z | test/prog14.cob | msharov/cobcy | 1c2362eed77abf142d53e77de54ad1e757369f95 | [
"MIT"
] | 5 | 2016-09-26T07:41:49.000Z | 2021-02-05T21:01:14.000Z | test/prog14.cob | msharov/cobcy | 1c2362eed77abf142d53e77de54ad1e757369f95 | [
"MIT"
] | 3 | 2017-08-30T17:47:59.000Z | 2021-10-05T18:01:20.000Z | identification division.
program-id. test-program.
environment division.
input-output section.
file-control.
select sample-rel-file
assign to disk
organization is relative
access mode is sequential.
data division.
file section.
fd sample-rel-file
label records are standard
value of file-id is "relative.dbf".
01 sample-rel-record.
05 name picture is X(25).
05 address picture is X(25).
05 aptnum picture is 9(4).
05 city picture is X(15).
05 zip picture is 99999B9999.
working-storage section.
01 count-var picture is 999 value is zero.
procedure division.
display "This program will write a file with relative organization".
display "The file will be called 'relative.dbf'".
open input sample-rel-file.
read-loop.
read sample-rel-record at end go to end-loop.
display sample-rel-record.
add 1 to count-var.
go to read-loop.
end-loop.
close sample-rel-file.
display "Read ", count-var, " records".
exit program.
| 23.261905 | 72 | 0.724667 |
ed557e02bba02c371bad899b033cfba78b839214 | 14,331 | cob | COBOL | deps/gnucobol-2.2/tests/testsuite.src/numeric-dump.cob | 6un9-h0-Dan/cobaul | 11115a7a77924d6e1642f847c613efb25f217e56 | [
"MIT"
] | 184 | 2020-04-15T14:28:37.000Z | 2020-09-22T15:57:55.000Z | deps/gnucobol-2.2/tests/testsuite.src/numeric-dump.cob | 6un9-h0-Dan/cobaul | 11115a7a77924d6e1642f847c613efb25f217e56 | [
"MIT"
] | 3 | 2020-09-22T18:09:12.000Z | 2021-11-27T22:37:52.000Z | deps/gnucobol-2.2/tests/testsuite.src/numeric-dump.cob | 6un9-h0-Dan/cobaul | 11115a7a77924d6e1642f847c613efb25f217e56 | [
"MIT"
] | 5 | 2020-04-21T19:50:23.000Z | 2020-09-22T10:58:02.000Z | *> This file is part of GnuCOBOL.
*>
*> The GnuCOBOL compiler is free software: you can redistribute
*> it and/or modify it under the terms of the GNU General Public
*> License as published by the Free Software Foundation, either
*> version 3 of the License, or (at your option) any later
*> version.
*>
*> GnuCOBOL is distributed in the hope that it will be useful,
*> but WITHOUT ANY WARRANTY; without even the implied warranty of
*> MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
*> GNU General Public License for more details.
*>
*> You should have received a copy of the GNU General Public
*> License along with GnuCOBOL.
*> If not, see <http://www.gnu.org/licenses/>.
IDENTIFICATION DIVISION.
PROGRAM-ID. prog.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 G-1.
02 X-1 PIC 9(1) VALUE 1
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-2.
02 X-2 PIC 9(2) VALUE 12
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-3.
02 X-3 PIC 9(3) VALUE 123
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-4.
02 X-4 PIC 9(4) VALUE 1234
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-5.
02 X-5 PIC 9(5) VALUE 12345
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-6.
02 X-6 PIC 9(6) VALUE 123456
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-7.
02 X-7 PIC 9(7) VALUE 1234567
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-8.
02 X-8 PIC 9(8) VALUE 12345678
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-9.
02 X-9 PIC 9(9) VALUE 123456789
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-10.
02 X-10 PIC 9(10) VALUE 1234567890
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-11.
02 X-11 PIC 9(11) VALUE 12345678901
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-12.
02 X-12 PIC 9(12) VALUE 123456789012
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-13.
02 X-13 PIC 9(13) VALUE 1234567890123
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-14.
02 X-14 PIC 9(14) VALUE 12345678901234
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-15.
02 X-15 PIC 9(15) VALUE 123456789012345
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-16.
02 X-16 PIC 9(16) VALUE 1234567890123456
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-17.
02 X-17 PIC 9(17) VALUE 12345678901234567
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-18.
02 X-18 PIC 9(18) VALUE 123456789012345678
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S1.
02 X-S1 PIC S9(1) VALUE -1
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S2.
02 X-S2 PIC S9(2) VALUE -12
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S3.
02 X-S3 PIC S9(3) VALUE -123
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S4.
02 X-S4 PIC S9(4) VALUE -1234
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S5.
02 X-S5 PIC S9(5) VALUE -12345
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S6.
02 X-S6 PIC S9(6) VALUE -123456
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S7.
02 X-S7 PIC S9(7) VALUE -1234567
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S8.
02 X-S8 PIC S9(8) VALUE -12345678
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S9.
02 X-S9 PIC S9(9) VALUE -123456789
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S10.
02 X-S10 PIC S9(10) VALUE -1234567890
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S11.
02 X-S11 PIC S9(11) VALUE -12345678901
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S12.
02 X-S12 PIC S9(12) VALUE -123456789012
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S13.
02 X-S13 PIC S9(13) VALUE -1234567890123
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S14.
02 X-S14 PIC S9(14) VALUE -12345678901234
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S15.
02 X-S15 PIC S9(15) VALUE -123456789012345
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S16.
02 X-S16 PIC S9(16) VALUE -1234567890123456
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S17.
02 X-S17 PIC S9(17) VALUE -12345678901234567
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
01 G-S18.
02 X-S18 PIC S9(18) VALUE -123456789012345678
@USAGE@.
02 FILLER PIC X(18) VALUE SPACE.
PROCEDURE DIVISION.
*> Dump all values
CALL "dump" USING G-1
END-CALL.
CALL "dump" USING G-2
END-CALL.
CALL "dump" USING G-3
END-CALL.
CALL "dump" USING G-4
END-CALL.
CALL "dump" USING G-5
END-CALL.
CALL "dump" USING G-6
END-CALL.
CALL "dump" USING G-7
END-CALL.
CALL "dump" USING G-8
END-CALL.
CALL "dump" USING G-9
END-CALL.
CALL "dump" USING G-10
END-CALL.
CALL "dump" USING G-11
END-CALL.
CALL "dump" USING G-12
END-CALL.
CALL "dump" USING G-13
END-CALL.
CALL "dump" USING G-14
END-CALL.
CALL "dump" USING G-15
END-CALL.
CALL "dump" USING G-16
END-CALL.
CALL "dump" USING G-17
END-CALL.
CALL "dump" USING G-18
END-CALL.
CALL "dump" USING G-S1
END-CALL.
CALL "dump" USING G-S2
END-CALL.
CALL "dump" USING G-S3
END-CALL.
CALL "dump" USING G-S4
END-CALL.
CALL "dump" USING G-S5
END-CALL.
CALL "dump" USING G-S6
END-CALL.
CALL "dump" USING G-S7
END-CALL.
CALL "dump" USING G-S8
END-CALL.
CALL "dump" USING G-S9
END-CALL.
CALL "dump" USING G-S10
END-CALL.
CALL "dump" USING G-S11
END-CALL.
CALL "dump" USING G-S12
END-CALL.
CALL "dump" USING G-S13
END-CALL.
CALL "dump" USING G-S14
END-CALL.
CALL "dump" USING G-S15
END-CALL.
CALL "dump" USING G-S16
END-CALL.
CALL "dump" USING G-S17
END-CALL.
CALL "dump" USING G-S18
END-CALL.
INITIALIZE X-1.
CALL "dump" USING G-1
END-CALL.
INITIALIZE X-2.
CALL "dump" USING G-2
END-CALL.
INITIALIZE X-3.
CALL "dump" USING G-3
END-CALL.
INITIALIZE X-4.
CALL "dump" USING G-4
END-CALL.
INITIALIZE X-5.
CALL "dump" USING G-5
END-CALL.
INITIALIZE X-6.
CALL "dump" USING G-6
END-CALL.
INITIALIZE X-7.
CALL "dump" USING G-7
END-CALL.
INITIALIZE X-8.
CALL "dump" USING G-8
END-CALL.
INITIALIZE X-9.
CALL "dump" USING G-9
END-CALL.
INITIALIZE X-10.
CALL "dump" USING G-10
END-CALL.
INITIALIZE X-11.
CALL "dump" USING G-11
END-CALL.
INITIALIZE X-12.
CALL "dump" USING G-12
END-CALL.
INITIALIZE X-13.
CALL "dump" USING G-13
END-CALL.
INITIALIZE X-14.
CALL "dump" USING G-14
END-CALL.
INITIALIZE X-15.
CALL "dump" USING G-15
END-CALL.
INITIALIZE X-16.
CALL "dump" USING G-16
END-CALL.
INITIALIZE X-17.
CALL "dump" USING G-17
END-CALL.
INITIALIZE X-18.
CALL "dump" USING G-18
END-CALL.
INITIALIZE X-S1.
CALL "dump" USING G-S1
END-CALL.
INITIALIZE X-S2.
CALL "dump" USING G-S2
END-CALL.
INITIALIZE X-S3.
CALL "dump" USING G-S3
END-CALL.
INITIALIZE X-S4.
CALL "dump" USING G-S4
END-CALL.
INITIALIZE X-S5.
CALL "dump" USING G-S5
END-CALL.
INITIALIZE X-S6.
CALL "dump" USING G-S6
END-CALL.
INITIALIZE X-S7.
CALL "dump" USING G-S7
END-CALL.
INITIALIZE X-S8.
CALL "dump" USING G-S8
END-CALL.
INITIALIZE X-S9.
CALL "dump" USING G-S9
END-CALL.
INITIALIZE X-S10.
CALL "dump" USING G-S10
END-CALL.
INITIALIZE X-S11.
CALL "dump" USING G-S11
END-CALL.
INITIALIZE X-S12.
CALL "dump" USING G-S12
END-CALL.
INITIALIZE X-S13.
CALL "dump" USING G-S13
END-CALL.
INITIALIZE X-S14.
CALL "dump" USING G-S14
END-CALL.
INITIALIZE X-S15.
CALL "dump" USING G-S15
END-CALL.
INITIALIZE X-S16.
CALL "dump" USING G-S16
END-CALL.
INITIALIZE X-S17.
CALL "dump" USING G-S17
END-CALL.
INITIALIZE X-S18.
CALL "dump" USING G-S18
END-CALL.
MOVE ZERO TO X-1.
CALL "dump" USING G-1
END-CALL.
MOVE ZERO TO X-2.
CALL "dump" USING G-2
END-CALL.
MOVE ZERO TO X-3.
CALL "dump" USING G-3
END-CALL.
MOVE ZERO TO X-4.
CALL "dump" USING G-4
END-CALL.
MOVE ZERO TO X-5.
CALL "dump" USING G-5
END-CALL.
MOVE ZERO TO X-6.
CALL "dump" USING G-6
END-CALL.
MOVE ZERO TO X-7.
CALL "dump" USING G-7
END-CALL.
MOVE ZERO TO X-8.
CALL "dump" USING G-8
END-CALL.
MOVE ZERO TO X-9.
CALL "dump" USING G-9
END-CALL.
MOVE ZERO TO X-10.
CALL "dump" USING G-10
END-CALL.
MOVE ZERO TO X-11.
CALL "dump" USING G-11
END-CALL.
MOVE ZERO TO X-12.
CALL "dump" USING G-12
END-CALL.
MOVE ZERO TO X-13.
CALL "dump" USING G-13
END-CALL.
MOVE ZERO TO X-14.
CALL "dump" USING G-14
END-CALL.
MOVE ZERO TO X-15.
CALL "dump" USING G-15
END-CALL.
MOVE ZERO TO X-16.
CALL "dump" USING G-16
END-CALL.
MOVE ZERO TO X-17.
CALL "dump" USING G-17
END-CALL.
MOVE ZERO TO X-18.
CALL "dump" USING G-18
END-CALL.
MOVE ZERO TO X-S1.
CALL "dump" USING G-S1
END-CALL.
MOVE ZERO TO X-S2.
CALL "dump" USING G-S2
END-CALL.
MOVE ZERO TO X-S3.
CALL "dump" USING G-S3
END-CALL.
MOVE ZERO TO X-S4.
CALL "dump" USING G-S4
END-CALL.
MOVE ZERO TO X-S5.
CALL "dump" USING G-S5
END-CALL.
MOVE ZERO TO X-S6.
CALL "dump" USING G-S6
END-CALL.
MOVE ZERO TO X-S7.
CALL "dump" USING G-S7
END-CALL.
MOVE ZERO TO X-S8.
CALL "dump" USING G-S8
END-CALL.
MOVE ZERO TO X-S9.
CALL "dump" USING G-S9
END-CALL.
MOVE ZERO TO X-S10.
CALL "dump" USING G-S10
END-CALL.
MOVE ZERO TO X-S11.
CALL "dump" USING G-S11
END-CALL.
MOVE ZERO TO X-S12.
CALL "dump" USING G-S12
END-CALL.
MOVE ZERO TO X-S13.
CALL "dump" USING G-S13
END-CALL.
MOVE ZERO TO X-S14.
CALL "dump" USING G-S14
END-CALL.
MOVE ZERO TO X-S15.
CALL "dump" USING G-S15
END-CALL.
MOVE ZERO TO X-S16.
CALL "dump" USING G-S16
END-CALL.
MOVE ZERO TO X-S17.
CALL "dump" USING G-S17
END-CALL.
MOVE ZERO TO X-S18.
CALL "dump" USING G-S18
END-CALL.
STOP RUN.
| 31.427632 | 72 | 0.431163 |
14871fadcb8341fe3484c0eaa00edf3300dad3f2 | 967 | cob | COBOL | languages/cobol/cobol24/ch22/chapt22j.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 34 | 2016-10-29T19:50:34.000Z | 2022-02-12T21:27:43.000Z | languages/cobol/cobol24/ch22/chapt22j.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | null | null | null | languages/cobol/cobol24/ch22/chapt22j.cob | sergev/vak-opensource | e1912b83dabdbfab2baee5e7a9a40c3077349381 | [
"Apache-2.0"
] | 19 | 2017-06-19T23:04:00.000Z | 2021-11-13T15:00:41.000Z | 000010 @OPTIONS MAIN,TEST
000020 Identification Division.
000030 Program-Id. Chapt22j.
000031*random Function
000040 Environment Division.
000050 Configuration Section.
000051 Source-Computer. IBM-PC.
000055 Object-Computer. IBM-PC.
000056 Data Division.
000057 Working-Storage Section.
000058 01 Random-Seed Pic 9(8) Value Zeros.
000059 01 Random-Number Pic 99 Value Zeros.
000069 01 Random-Generate Pic V9(18) Value Zeros.
000148 Procedure Division.
000159 Chapt22j-Start.
000160 Move Function Current-Date (9:8) To Random-Seed
000162 Compute Random-Generate = Function Random (Random-Seed)
000163 Compute Random-Number = (Random-Generate * 21) + 1
000164 Display Random-Number
000165 Perform 19 Times
000166 Compute Random-Generate = Function Random
000167 Compute Random-Number = (Random-Generate * 21) + 1
000169 Display Random-Number
000170 End-Perform
000171 Stop Run
000172 .
| 37.192308 | 66 | 0.735264 |
0cad520da1e9b9a13a5e6c3c61731e6b768deb51 | 485 | cbl | COBOL | src/test/resources/io/proleap/cobol/ast/HelloWorld.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 81 | 2018-03-29T23:39:01.000Z | 2022-03-07T11:23:10.000Z | src/test/resources/io/proleap/cobol/ast/HelloWorld.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 64 | 2017-03-27T11:15:15.000Z | 2018-03-09T18:10:43.000Z | src/test/resources/io/proleap/cobol/ast/HelloWorld.cbl | stawi/cobol85parser | 1e3426b401a6a81d5f19d5e8737856e53f10bce6 | [
"MIT"
] | 44 | 2019-01-03T11:48:54.000Z | 2021-12-21T09:46:42.000Z | 000000 Identification Division. 00000000
000000 Program-ID. 00000000
000000 HELLOWORLD. 00000000
000000 Procedure Division. 00000000
000000 Display "Hello world". 00000000
000000 STOP RUN. 00000000 | 80.833333 | 80 | 0.342268 |
3e97c3b86ff3ec9d89240aba9df34c2009a28a78 | 7,802 | cbl | COBOL | cobol_mf/dcscat.cbl | adrianmahjour/db2-samples | ff984aec81c5c08ce28443d896c0818cfae4f789 | [
"Apache-2.0"
] | 54 | 2019-08-02T13:15:07.000Z | 2022-03-21T17:36:48.000Z | cobol_mf/dcscat.cbl | junsulee75/db2-samples | d9ee03101cad1f9167eebc1609b4151559124017 | [
"Apache-2.0"
] | 13 | 2019-07-26T13:51:16.000Z | 2022-03-25T21:43:52.000Z | cobol_mf/dcscat.cbl | junsulee75/db2-samples | d9ee03101cad1f9167eebc1609b4151559124017 | [
"Apache-2.0"
] | 75 | 2019-07-20T04:53:24.000Z | 2022-03-23T20:56:55.000Z | ***********************************************************************
** (c) Copyright IBM Corp. 2007 All rights reserved.
**
** The following sample of source code ("Sample") is owned by International
** Business Machines Corporation or one of its subsidiaries ("IBM") and is
** copyrighted and licensed, not sold. You may use, copy, modify, and
** distribute the Sample in any form without payment to IBM, for the purpose of
** assisting you in the development of your applications.
**
** The Sample code is provided to you on an "AS IS" basis, without warranty of
** any kind. IBM HEREBY EXPRESSLY DISCLAIMS ALL WARRANTIES, EITHER EXPRESS OR
** IMPLIED, INCLUDING, BUT NOT LIMITED TO, THE IMPLIED WARRANTIES OF
** MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE. Some jurisdictions do
** not allow for the exclusion or limitation of implied warranties, so the above
** limitations or exclusions may not apply to you. IBM shall not be liable for
** any damages you suffer as a result of using, copying, modifying or
** distributing the Sample, even if IBM has been advised of the possibility of
** such damages.
***********************************************************************
**
** SOURCE FILE NAME: dcscat.cbl
**
** SAMPLE: Get information for a DCS directory in a database
**
** This program shows how to catalog to, get information
** for and uncatalog from a Database Connection Services
** (DCS) directory.
**
** DB2 APIs USED:
** sqlggdge -- GET DCS DIRECTORY ENTRY
** sqlggdad -- CATALOG DCS DIRECTORY ENTRY
** sqlggdsc -- OPEN DCS DIRECTORY SCAN
** sqlggdgt -- GET DCS DIRECTORY ENTRIES
** sqlggdcl -- CLOSE DCS DIRECTORY SCAN
** sqlggdel -- UNCATALOG DCS DIRECTORY ENTRY
**
** OUTPUT FILE: dcscat.out (available in the online documentation)
***********************************************************************
**
** For more information on the sample programs, see the README file.
**
** For information on developing COBOL applications, see the
** Application Development Guide.
**
** For information on DB2 APIs, see the Administrative API Reference.
**
** For the latest information on programming, compiling, and running
** DB2 applications, visit the DB2 application development website:
** http://www.software.ibm.com/data/db2/udb/ad
***********************************************************************
Identification Division.
Program-Id. "dcscat".
Data Division.
Working-Storage Section.
copy "sqlenv.cbl".
copy "sqlca.cbl".
* Local Variables
77 rc pic s9(9) comp-5.
77 errloc pic x(80).
* Variables for the DCS DIRECTORY SCAN APIs
77 dbcount pic s9(4) comp-5.
77 cbl-count pic s9(4) comp-5 value 1.
77 idx pic s9(4) comp-5.
Procedure Division.
dcscat-pgm section.
display "Sample COBOL Program : DCSCAT.CBL".
move "this is a dcs database" to COMMENT of SQL-DIR-ENTRY.
move "dcsnm" to LDB of SQL-DIR-ENTRY.
move "targetnm" to TDB of SQL-DIR-ENTRY.
move "arName" to AR of SQL-DIR-ENTRY.
move SQL-DCS-STR-ID to
STRUCT-ID of SQL-DIR-ENTRY.
move " " to PARM of SQL-DIR-ENTRY.
display "cataloging the DCS database : ",
TDB of SQL-DIR-ENTRY.
***********************************
* CATALOG DCS DATABASE API called *
***********************************
call "sqlggdad" using
by reference sqlca
by reference SQL-DIR-ENTRY
returning rc.
move "cataloging the database" to errloc.
call "checkerr" using SQLCA errloc.
display "database ", TDB of SQL-DIR-ENTRY,
" has been catalogued".
display "now listing all databases".
perform list-dcs thru end-list-dcs.
display "now uncataloging the database that was created ",
TDB of SQL-DIR-ENTRY.
*************************************
* UNCATALOG DCS DATABASE API called *
*************************************
call "sqlggdel" using
by reference sqlca
by reference SQL-DIR-ENTRY
returning rc.
move "uncataloging the database" to errloc.
call "checkerr" using SQLCA errloc.
display "now listing all databases [after uncatalog DCS]".
perform list-dcs thru end-list-dcs.
end-dcscat. stop run.
list-dcs Section.
**************************************
* OPEN DCS DIRECTORY SCAN API called *
**************************************
call "sqlggdsc" using
by reference sqlca
by reference dbcount
returning rc.
if sqlcode equal SQLE-RC-NO-ENTRY
display "--- DCS directory is empty ---"
go to close-dcs-scan.
move "opening the database directory scan" to errloc.
call "checkerr" using SQLCA errloc.
if dbcount not equal 0 then
perform display-dcs-info thru end-display-dcs-info
varying idx from 1 by 1 until idx equal dbcount.
display-dcs-info Section.
*************************************
* GET DCS DIRECTORY SCAN API called *
*************************************
call "sqlggdgt" using
by reference sqlca
by reference cbl-count
by reference SQL-DIR-ENTRY
returning rc.
display "number of dcs databases : " , cbl-count.
display "Local Database Name :" , LDB of SQL-DIR-ENTRY.
display "Target Database Name:" , TDB of SQL-DIR-ENTRY.
display "App. Requestor Name :" , AR of SQL-DIR-ENTRY.
display "DCS parameters :" , PARM of SQL-DIR-ENTRY.
display "Comment :" , COMMENT of SQL-DIR-ENTRY.
display "DCS Release Level :" ,
RELEASE-LVL of SQL-DIR-ENTRY.
display " ".
end-display-dcs-info. exit.
move "getting dcs database entries" to errloc.
call "checkerr" using SQLCA errloc.
*********************************************
* GET DCS DIRECTORY FOR DATABASE API called *
*********************************************
* use the SQL-DIR-ENTRY from the previous call
call "sqlggdge" using
by reference sqlca
by reference SQL-DIR-ENTRY
returning rc.
close-dcs-scan.
***************************************
* CLOSE DCS DIRECTORY SCAN API called *
***************************************
call "sqlggdcl" using
by reference sqlca
returning rc.
move "closing the database directory scan" to errloc.
call "checkerr" using SQLCA errloc.
end-list-dcs. exit.
| 42.172973 | 87 | 0.487695 |
Subsets and Splits
No saved queries yet
Save your SQL queries to embed, download, and access them later. Queries will appear here once saved.