Oy! Griff!
-
I'll see you and raise you![^]
:rolleyes: :rolleyes: :rolleyes: I fail to see how that, which is basically a balloon badly shaped as a fluffy animal, is better than 4, that is FOUR, perfectly formed chocolate sheep! Your raise is a fail! ;P
"State acheived after eating too many chocolate-covered coconut bars - bountiful" Chris C-B
-
:rolleyes: :rolleyes: :rolleyes: I fail to see how that, which is basically a balloon badly shaped as a fluffy animal, is better than 4, that is FOUR, perfectly formed chocolate sheep! Your raise is a fail! ;P
"State acheived after eating too many chocolate-covered coconut bars - bountiful" Chris C-B
But you see young lady, you can't [REDACTED] chocolate!
-
But you see young lady, you can't [REDACTED] chocolate!
... all I got from that was "young" and "lady"! ;P
"State acheived after eating too many chocolate-covered coconut bars - bountiful" Chris C-B
-
You said Tuesday was good for COBOL:
000010 IDENTIFICATION DIVISION.
000020 PROGRAM-ID. SLEEVE.
000030 AUTHOR. NAGY VILMOS.
000040 DATE-WRITTEN. 2014-03-25
000050 ENVIRONMENT DIVISION.
000060 INPUT-OUTPUT SECTION.
000070 FILE-CONTROL.
000080 SELECT GRIFF-FILE ASSIGN TO SYSIN
000090 ORGANIZATION IS LINE SEQUENTIAL.
000100 SELECT VILMOS-FILE ASSIGN TO SYSOUT
000110 ORGANIZATION IS LINE SEQUENTIAL.
000120
000130 DATA DIVISION.
000140 FILE SECTION.
000150 FD GRIFF-FILE
000160 RECORD CONTAINS 80 CHARACTERS
000170 DATA RECORD IS GRIFF-IN.
000180 01 GRIFF-IN
000181 05 SOURCE PIC X(11).
000182 05 FILLER PIC X(69).
000190
000200 FD VILMOS-FILE
000210 RECORD CONTAINS 80 CHARACTERS
000220 DATA RECORD IS VILMOS-OUT.
000230 01 VILMOS-OUT PIC X(80).
000240
000250 WORKING-STORAGE SECTION.
000260 01 DATA-REMAINS-SWITCH PIC X(2) VALUE SPACES.
000261 01 RECORDS-WRITTEN PIC 99.
000270
000320 PROCEDURE DIVISION.
000321
000330 TRANSFER-LAPTOP-SLEEVE.
000340 OPEN INPUT GRIFF-FILE
000350 OUTPUT VILMOS-FILE.
000351 MOVE ZERO TO RECORDS-WRITTEN.
000360 READ GRIFF-FILE
000370 AT END MOVE 'NO' TO DATA-REMAINS-SWITCH
000380 END-READ.
000390 PERFORM TRANSFER-LAPTOP-SLEEVE
000410 UNTIL DATA-REMAINS-SWITCH = 'NO'.
000420 CLOSE GRIFF-FILE
000430 VILMOS-FILE.
000440 STOP RUN.
000450
000460 TRANSFER-LAPTOP-SLEEVE.
000470 MOVE GRIFF-IN TO VILMOS-OUT.
000480 IF SOURCE = 'CODEPROJECT'
000490 WRITE VILMOS-OUT.
000500 READ GRIFF-FILE
000510 AT END MOVE 'NO' TO DATA-REMAINS-SWITCH
000520 END-READ. -
In the balance, I'd lean towards COBOL over VB6 just for the novelty value.
Nagy Vilmos wrote:
I'd lean towards COBOL over VB6 just for the novelty value.
Not to mention the increased efficiency!
Will Rogers never met me.
-
Well, I do like a challenge (and I know the way to Griff's heart)! :-D
"State acheived after eating too many chocolate-covered coconut bars - bountiful" Chris C-B
DeathByChocolate wrote:
I know the way to Griff's heart)
Would that be the sheep, or the chocolate? ;)
Will Rogers never met me.
-
You said Tuesday was good for COBOL:
000010 IDENTIFICATION DIVISION.
000020 PROGRAM-ID. SLEEVE.
000030 AUTHOR. NAGY VILMOS.
000040 DATE-WRITTEN. 2014-03-25
000050 ENVIRONMENT DIVISION.
000060 INPUT-OUTPUT SECTION.
000070 FILE-CONTROL.
000080 SELECT GRIFF-FILE ASSIGN TO SYSIN
000090 ORGANIZATION IS LINE SEQUENTIAL.
000100 SELECT VILMOS-FILE ASSIGN TO SYSOUT
000110 ORGANIZATION IS LINE SEQUENTIAL.
000120
000130 DATA DIVISION.
000140 FILE SECTION.
000150 FD GRIFF-FILE
000160 RECORD CONTAINS 80 CHARACTERS
000170 DATA RECORD IS GRIFF-IN.
000180 01 GRIFF-IN
000181 05 SOURCE PIC X(11).
000182 05 FILLER PIC X(69).
000190
000200 FD VILMOS-FILE
000210 RECORD CONTAINS 80 CHARACTERS
000220 DATA RECORD IS VILMOS-OUT.
000230 01 VILMOS-OUT PIC X(80).
000240
000250 WORKING-STORAGE SECTION.
000260 01 DATA-REMAINS-SWITCH PIC X(2) VALUE SPACES.
000261 01 RECORDS-WRITTEN PIC 99.
000270
000320 PROCEDURE DIVISION.
000321
000330 TRANSFER-LAPTOP-SLEEVE.
000340 OPEN INPUT GRIFF-FILE
000350 OUTPUT VILMOS-FILE.
000351 MOVE ZERO TO RECORDS-WRITTEN.
000360 READ GRIFF-FILE
000370 AT END MOVE 'NO' TO DATA-REMAINS-SWITCH
000380 END-READ.
000390 PERFORM TRANSFER-LAPTOP-SLEEVE
000410 UNTIL DATA-REMAINS-SWITCH = 'NO'.
000420 CLOSE GRIFF-FILE
000430 VILMOS-FILE.
000440 STOP RUN.
000450
000460 TRANSFER-LAPTOP-SLEEVE.
000470 MOVE GRIFF-IN TO VILMOS-OUT.
000480 IF SOURCE = 'CODEPROJECT'
000490 WRITE VILMOS-OUT.
000500 READ GRIFF-FILE
000510 AT END MOVE 'NO' TO DATA-REMAINS-SWITCH
000520 END-READ.Brilliant! :-D I haven't done/seen COBOL since 1975! It took 200 Hollerith cards to do a 'Hello World' program, and my version generated 152 errors while compiling. The computer center expert that 'owned' the sacred COBOL manual could not identify one thing wrong with my code. That was my first and last attempt to use it, and I've never missed it. X|
Will Rogers never met me.
-
Brilliant! :-D I haven't done/seen COBOL since 1975! It took 200 Hollerith cards to do a 'Hello World' program, and my version generated 152 errors while compiling. The computer center expert that 'owned' the sacred COBOL manual could not identify one thing wrong with my code. That was my first and last attempt to use it, and I've never missed it. X|
Will Rogers never met me.
For five years I was a fully paid up COBOL CODE MONKEY, it took me ages to stop using capitals.
-
For five years I was a fully paid up COBOL CODE MONKEY, it took me ages to stop using capitals.
Oh, you poor man! That explains so much about the way you turned out... :omg:
Will Rogers never met me.
-
Brilliant! :-D I haven't done/seen COBOL since 1975! It took 200 Hollerith cards to do a 'Hello World' program, and my version generated 152 errors while compiling. The computer center expert that 'owned' the sacred COBOL manual could not identify one thing wrong with my code. That was my first and last attempt to use it, and I've never missed it. X|
Will Rogers never met me.
Probably left off the '.' at the end of a line ;)
Steve _________________ I C(++) therefore I am
-
Probably left off the '.' at the end of a line ;)
Steve _________________ I C(++) therefore I am
Very likely true, Steve. A very picky language, COBOL is!
Will Rogers never met me.