HP3000-L Archives

June 2001, Week 4

HP3000-L@RAVEN.UTC.EDU

Options: Use Monospaced Font
Show Text Part by Default
Show All Mail Headers

Message: [<< First] [< Prev] [Next >] [Last >>]
Topic: [<< First] [< Prev] [Next >] [Last >>]
Author: [<< First] [< Prev] [Next >] [Last >>]

Print Reply
Subject:
From:
Ted Ashton <[log in to unmask]>
Reply To:
Ted Ashton <[log in to unmask]>
Date:
Wed, 27 Jun 2001 14:42:12 -0400
Content-Type:
text/plain
Parts/Attachments:
text/plain (49 lines)
Just for completeness sake . . .

Thus it was written in the epistle of Mike Hornsby,
> 16 bit item types:
> I - Signed binary integer in 2's complement
> J - Same as I but allows Query to edit input for COBOL COMP format
> K - Absolute binary value
> R - An HP formatted floating point number
  E - An IEEE-formated floating point number
>
> 8 bit item types (must be used in multiples of two)
> U - ASCII data but no lower case alphabetic characters allowed
> X - Any ASCII data
> Z - Zoned decimal format
>
> 4 bit item types (must be specified in multiples of four)
> P - Packed decimal number
>
> Item   Length   COBOL                 FORTRAN     SPL
> Type   Bytes
>  I       2      S9    -S9(4)  COMP    INTEGER     INTEGER
>  I2      4      S9(5) -S9(9)  COMP    INTEGER*4   DOUBLE INTEGER
>  I4      8      S9(10)-S9(18) COMP
>  J       2      S9    -S9(4)  COMP
>  J2      4      S9(5) -S9(9)  COMP
>  J4      8      S9(10)-S9(18) COMP
>  K1      2                            LOGICAL     LOGICAL
>  R2      4                            REAL        REAL
>  R4      8                            DOUBLE      LONG
   E2      4                            Real
   E4      8                            Double Precision
>  Un      n      Display PIC A         CHARACTER   BYTE
>  Xn      n      Display PIC X         CHARACTER   BYTE
>  Zn      n      Display PIC 9         CHARACTER
>  Pn     n/2     COMP-3                NUMERIC

Ted
--
Ted Ashton ([log in to unmask]), Info Sys, Southern Adventist University
          ==========================================================
This trend [emphasizing applied mathematics over pure mathematics] will make
the queen of the sciences into the quean of the sciences.
                        -- Passano, L.M.
          ==========================================================
         Deep thoughts to be found at http://www.southern.edu/~ashted

* To join/leave the list, search archives, change list settings, *
* etc., please visit http://raven.utc.edu/archives/hp3000-l.html *

ATOM RSS1 RSS2