---- Start of Message by Paul Robinson ----

WITH MESSAGE DO 

BEGIN 

Sven Barth wrote (quoting me):


>> That (PASCALMAIN) will have to change, the object file format for 370 
>> machines limits a CSECT to 8 characters, with the 
>> optional characters @ # and $.  So I might call it MAIN or possibly #MAIN.  
>> (On the PDP/11, most operating systems (RT-11, 
>> RSTS/E, RSX) defined the main program in any language as ".MAIN." )
>
> If I understand you correctly, then you might confuse label names with 
> section names.

No, I know exactly what I mean.  Label and section names are under the same 
rules in an assembler program on the 370, and a CSECT in 370 Assembly language

THENAME    CSECT

 is equivalent to

Procedure THENAME;
(* in Pascal *)

       SUBROUTINE THENAME
C       in Fortran

000010 PROCEDURE DIVISION.
000020 PROGRAM-ID.  THENAME.
000030*  In Cobol


int thename(void) {
/* In C */
}Excepting, of course, for the brain-dead moronic behavior of assigning 
case-sensitivity to identifiers in C.

Paul

The Lessons of history teach us - if they teach us anything - that no one 
learns the lessons that history teaches us.

END.
----

_______________________________________________
fpc-devel maillist  -  fpc-devel@lists.freepascal.org
http://lists.freepascal.org/mailman/listinfo/fpc-devel

Reply via email to