Filling Operations

[HOTHFILL]

It is possible to speed up the filling process with the loss of some protection, and to globally transfer an array or a matrix to a histogram.

Fast Filling Entries

[HFASTFIL]

If the program that is using HBOOK fills many histograms several times a substantial fraction of time can be spent by HFILL in searching for the histogram it has to fill, deciding which type of histogram it is and unpacking and packing bits if more than one channel is to be stored in one computer word. To reduce the overall filling time, there are several actions that can be taken

  1. Bypass part of the logic that finds out the characteristics of the histogram to fill. This can be achieved by using, instead of HFILL the special filling entries described in this section.
  2. Avoid packing more than one channel in a computer word.

    For these reasons it is recommended to use always HFILL at the development stage, and replace it later with HF1, HF2, etc. only when a rather stable program is going to be used extensively.

    Calls to HFILL and HF1 or HF2 cannot be mixed on the same ID.

                            +------------------------+
                            | CALL  HF1 (ID,X,WEIGHT) |
                            +------------------------+
                                      

    Action: Analogous to HFILL on a 1-dimensional histogram but HBARX and HIDOPT(ID,'STAT') STAT are ignored.

    Input parameters:
    ID
    histogram identifier
    X
    value of the abscissa
    WEIGHT
    event weight

                           +--------------------------+
                           | CALL  HF2 (ID,X,Y,WEIGHT) |
                           +--------------------------+
                                      

    Action: Analogous to HFILL on a 2-dimensional histogram except that projections, bands, slices are not filled. HBARY is ignored as well.

    Input parameters:
    ID
    histogram identifier
    X
    value of the abscissa
    Y
    value of the ordinate
    WEIGHT
    event weight

                         +------------------------------+
                         |CALL  HFF1 (ID,*NID*,X,WEIGHT) |
                         +------------------------------+
                                      

    Action: Analogous to HF1 with the same restrictions.

    Input parameters:
    ID
    histogram identifier
    NID
    is a histogram-specific variable that has to be provided by the user. Before the first call, NID must be initialized to 0. In subsequent calls to HFF1 the constant NID must then be used in order to skip the calculation of the histogram address.
    X
    value of the abscissa
    WEIGHT
    event weight
    Output parameter:
    NID
    After the first call to HFF1, NID will contain the current address of histogram ID.

                           +--------------------------+
                           | CALL  HFF2 (ID,NID,X,Y,W) |
                           +--------------------------+
                                      

    Action: Analogous to HF2 with the use of the parameter NID as explained for HFF1

                           +--------------------------+
                           | CALL  HFPAK1 (ID,NID,V,N) |
                           +--------------------------+
                                      

    Action: Fill an histogram using the contents of a vector.

    Input parameters:
    ID
    histogram identifier
    V
    array containing the values to be entered into the histogram.
    N
    length (dimension) of the array V
    Input/output parameter:
    *NID*
    address of histogram (see HFF1)

    This subroutine has the same effect as

       DO 10 I=1,N
    
    10 CALL HFF1(ID,NID,V(I),1.)
    

    where the array V of N words must have been filled previously by the user.

                           +--------------------------+
                           |CALL  HIPAK1 (ID,NID,IV,N) |
                           +--------------------------+
                                      

    Action: Analogous to HFPAK1, except that the user vector contains now integers instead of real numbers.

    [HGLOBFIL]

    Global Filling

    A vector or matrix can be transferred into a histogram with a single call.

                             +----------------------+
                             |CALL  HPAK (ID,CONTEN) |
                             +----------------------+
                                      

    Action: Transfer the contents of an array as channel contents into an histogram. The original contents of the histogram are overwritten.

    Input parameters:
    ID
    an existing histogram identifier
    CONTEN
    a user array, suitably dimensioned

    Remark:

    1. In the case of a 1-dimensional histogram, the dimension of the array must at least be equal to the number of histogram channels (NCHAN), i.e. DIMENSION CONTEN(NX) with NX>NCHAN
    2. In the case of a 2-dimensional histogram, the dimensions of the array must exactly be equal to the number of histogram channels (NCHANX and NCHANY), i.e. DIMENSION CONTEN(NX,NY) with NX=NCHAN and NY=NCHANY Projections and slices, if present for the given histogram, are not filled.

                              +------------------------+
                              |CALL  HPAKAD (ID,CONTEN) |
                              +------------------------+
                                        

      Action: Similar to HPAK, but instead of overwriting the channel contents, the array values are added to the respective channel contents.

                              +------------------------+
                              | CALL  HPAKE (ID,ERRORS) |
                              +------------------------+
                                        

      Action: Store the contents of an array as the errors for the bins of the 1-dimensional histogram for which the option HBARX has been invoked.

      Input parameters:
      ID
      histogram identifier
      ERRORS
      user array containing the errors to be assigned to the histogram bin contents. Its dimension should be at least equal to the number of channels in histogram ID.

      Remark:

      If the HBARX option was not set for the given histogram, then it is activited by a call to HPAKE.

      Filling histograms using character variables

      Routines for which, using routine HLABEL, alphanumeric labels were associated with the histogram channels, are filled with the routines HFC1 and HFC2. These allow, on top of by bin number, to fill an histogram by specifying a alphanumeric channel identifier.

                         +----------------------------------+
                         | CALL  HFC1 (ID,IBIN,CLAB,W,CHOPT) |
                         +----------------------------------+
                                        

      Action: Fills a channel in a one-dimensional histogram.

      ID
      One-dimensional histogram identifier.
      IBIN
      Number of the bin to be filled (if !=0).
      CLAB
      Character variable containing the label describing the bin (if IBIN=0).
      CHOPT
      Character variable specifying the option desired.
      ' '
      default, as S;
      'N'
      filling order, i.e. the order of the labels on the plot is given by the sequence in which they are presented in the successive calls to the routine (this method can be very time consuming since all channels must be scanned at each call);
      'S'
      automatic sort;
      'U'
      if the channel does not exist then the underflow channel is incremented (by default a new channel is created for each new label).

      Remarks:

      1. If IBIN!=0, then the channel IBIN is filled; CLAB may then be undefined.
      2. When a label is encountered, which is not yet known, then for options 'N' and 'S' a new channel is added dynamically, while for option U the underflow channel is incremented.
      3. Routine HLABEL can be called before or after HFC1.

                    +------------------------------------------------+
                    | CALL  HFC2 (ID,IBINX,CLABX,IBINY,CLABY,W,CHOPT) |
                    +------------------------------------------------+
                                          

        Action: Fills for a two-dimensional histogram the channel identified by position CLABY with weight W.

        ID
        Two-dimensional histogram identifier.
        IBINX
        Number of the X-bin to be filled (if !=0).
        CLABX
        Character variable containing the label describing the X-bin (if IBINX=0).
        IBINY
        Number of the Y-bin to be filled (if !=0).
        CLABY
        Character variable containing the label describing the Y-bin (if IBINY=0).
        W
        Weight of the event to be entered into the histogram.
        CHOPT
        Character variable specifying the option desired.
        ' '
        default, as S;
        'N'
        filling order (see HFC1;
        S
        automatic sort (default)
        'U'
        if the channel does not exist then the underflow channel is incremented (by default a new channel is created for each new label).

        Remarks:

        1. For efficiency reasons, routine HLABEL must be called before HFC2.
        2. If IBINX!=0, then the channel described by IBINX is filled; CLABX may then be undefined.
        3. If IBINY!=0, then the channel described by IBINY is filled; CLABY may then be undefined.
        4. If the channel described by IBINX or CLABX does not exist, the underflow channel is incremented. Idem for IBINY and CLABY.

          The example below shows different uses of the label routines. The input data are the same as those used for building the Ntuple on page [more info]. Three histograms are booked. For the first one (11), the number of channels (13) is given explicitly, and a call to HLABEL declares all the labels for that histogram. Then a second histogram (12) is booked with one pre-declared channel. In fact this latter histogram will be filled with HFC1, in a way completely identical to histogram 11, but channels will be dynamically added as new labels are encountered. We also create a 2-D histogram (21), where for the y-axis we again pre-declare labels and we fill it with a call to HFC2. After the loop, where the histograms are filled, we tell HBOOK to order the labels in the second histogram (12) according to decreasing bin contents. This shows that it is not necessary, in the 1-D case, to pre-declare the labels of a histogram, but that they can be added to a histogram ``on the fly'', i.e. while filling. The sorting order can be specified after the histogram is filled. As stated earlier, labels are only printed on graphical output devices, so that one must use HPLOT/HIGZ to see the effect of the label routines. The calls to the HPLOT/HIGZ routines, used to generate the PostScript picture shown in Fig. [more info], are described in the HIGZ/HPLOT manual.

                  Example of the use of the histogram label routines
                                            

                PROGRAM CERN
                PARAMETER (NWPAWC = 30000)
                COMMON /PAWC/ IPAW(NWPAWC)
                REAL        RDATA(11)
                CHARACTER*4 CHDIV,CHDIVS(13), CHNAT,CHNATS(15)
                DATA CHDIVS /'AG', 'DD', 'DG', 'EF', 'EP', 'FI', 'LEP', 'PE',
               +           'PS', 'SPS', 'ST', 'TH', 'TIS'/
                DATA CHNATS /'AT', 'BE', 'CH', 'DE', 'DK', 'ES', 'FR', 'GB',
               +           'GR', 'IT', 'NL', 'NO', 'PT', 'SE', 'ZZ'/
                CALL HLIMIT(NWPAWC)
          *
                OPEN(11,FILE='aptuple.dat', STATUS='OLD')
                OPEN(12,file='hlabexa.ps',form='formatted',status='unknown')
                CALL HBOOK1(11,'Example HLABEL explicit list',13,1.,14.,0.)
                CALL HBOOK1(12,'Example HLABEL implicit list',1 ,0.,1. ,0.)
                CALL HBOOK2(21,'Example HLABEL 2-D',13,2.,15.,13,1.,14.,0.)
          *
                CALL HLABEL(11,13,CHDIVS,'N')
                CALL HLABEL(21,13,CHDIVS,'NY')
          *
          *-- Loop over input data
          *
                DO 10 IEVENT = 1, 99999
                   READ(11, '(10F4.0, F7.0)', END=20) RDATA
                   CHDIV    = CHDIVS(INT(RDATA(2)))
                   IGRADE   = RDATA(7)
                   CALL HFC1(11,0,CHDIV,1.,' ')
                   CALL HFC1(12,0,CHDIV,1.,' ')
                   CALL HFC2(21,IGRADE,' ',0,CHDIV,1.,' ')
             10 CONTINUE
             20 CALL HLABEL(12,0,' ','SV')
          *
          *-- Call the HPLOT/HIGZ routines to print the histos showing the labels
          *
                CALL HPLINT(0)
                CALL HPLCAP(-12)
                CALL HPLSET('VSIZ',0.20)
                CALL HPLSET('NDVX',-13.05)
                CALL HPLSET('HCOL',1105)
          
                CALL HPLSET('BCOL',1.5)
                CALL HPLSET('*FON',-60.)
                CALL HPLOPT('NBOX',1)
                CALL HPLZON(2,2,1,' ')
                CALL HPLOT(11,' ',' ',0)
                CALL HPLOT(12,' ',' ',0)
                CALL HPLZON(1,2,2,'S')
                CALL HPLOPT('GRID',1)
                CALL HPLOT(21,'BOX',' ',0)
                CALL HPLEND
          *
                END
          

          
          

          Figure: Example of the use of HLABEL

          [fig:HLABEL]

          1. The top left picture shows the contents of the histogram ordered alphabetically by label.
          2. The top right picture shows the same histogram, but with the bins ordered by decreasing contents, irrespective of their label.
          3. The lower picture shows a two-dimensional histogram, where the ordinate (Y-axis) ordered alphabetically.
                              Example of booking options
                                            

                SUBROUTINE HEXAM2
          *.==========>
          *.           TEST OF SOME BOOKING OPTIONS USING HBOOK RANDOM
          *.           NUMBER GENERATORS.
          *..=========> ( R.Brun )
                COMMON/HDEXF/C1,C2,XM1,XM2,XS1,XS2
                DOUBLE PRECISION C1,C2,XM1,XM2,XS1,XS2
                EXTERNAL HTFUN1,HTFUN2
          *.___________________________________________
          *.
          *             Booking
          *
                C1=1.
                C2=0.5
                XM1=0.3
                XM2=0.7
                XS1=0.07
                XS2=0.12
          *
                CALL HBFUN1(100,'TEST OF HRNDM1',100,0.,1.,HTFUN1)
                CALL HIDOPT(100,'STAR')
                CALL HCOPY(100,10,' ')
          *
                CALL HBOOK1(110,  'THIS HISTOGRAM IS FILLED ACCORDING TO THE FUNCT
               +ION HTFUN1'
               +  ,100,0.,1.,1000.)
          *
                CALL HBFUN2(200,'TEST OF HRNDM2',100,0.,1.,40,0.,1.,HTFUN2)
                CALL HSCALE(200,0.)
                CALL HCOPY(200,20,' ')
          *
                CALL HBOOK2(210,'HIST FILLED WITH HFILL AND HRNDM2' ,100,0.,1.,
               +  40,0.,1.,30.)
          *
          *             Filling
          *
                DO 10 I=1,5000
                   X=HRNDM1(100)
                   CALL HFILL(110,X,0.,1.)
                   CALL HRNDM2(200,X,Y)
                   CALL HFILL(210,X,Y,1.)
            10  CONTINUE
          *
          *             Save all histograms on file 'hexam.dat'
          
          *
                CALL HRPUT(0,'hexam.dat','N')
          *
                CALL HDELET(100)
                CALL HDELET(200)
          *
          *             Printing
          *
                CALL HPRINT(0)
                END
                FUNCTION HTFUN1(X)
                DOUBLE PRECISION HDFUN1
                HTFUN1=HDFUN1(X)
                END
                FUNCTION HTFUN2(X,Y)
                HTFUN2=HTFUN1(X)*HTFUN1(Y)
                END
                DOUBLE PRECISION FUNCTION HDFUN1(X)
                COMMON/HDEXF/C1,C2,XM1,XM2,XS1,XS2
                DOUBLE PRECISION C1,C2,XM1,XM2,XS1,XS2,A1,A2,X1,X2
          *
                A1=-0.5*((X-XM1)/XS1)**2
                A2=-0.5*((X-XM2)/XS2)**2
                IF(A1.LT.-20.)THEN
                   X1=0.
                ELSEIF(A1.GT.20.)THEN
                   X1=1.E5
                ELSE
                   X1=C1*EXP(A1)
                ENDIF
                IF(A2.LT.-20.)THEN
                   X2=0.
                ELSEIF(A2.GT.20.)THEN
                   X2=1.E5
                ELSE
                   X2=C2*EXP(A2)
                ENDIF
                HDFUN1=X1+X2
                END
          
                                   Output Generated
                                            

           TEST OF HRNDM1
           HBOOK     ID =        10                                        DATE  17/12/91              NO =   4
                 10                                   ****
                  9.75
                  9.5                                *    *
                  9.25
                  9                                 *      *
                  8.75
                  8.5
                  8.25                             *        *
                  8
                  7.75
                  7.5                             *          *
                  7.25
                  7
                  6.75                           *            *
                  6.5
                  6.25
                  6                                            *
                  5.75                          *
                  5.5
                  5.25
                  5                            *                *                           ********
                  4.75                                                                    **        **
                  4.5                                                                    *            *
                  4.25                                           *                      *              *
                  4                           *                                        *                *
                  3.75                                                                *                  *
                  3.5                                             *                  *                    *
                  3.25                       *                                      *                      *
                  3                                                *               *                        *
                  2.75                      *                                     *                          *
                  2.5                                               *            *                            *
                  2.25                     *                                    *                              *
                  2                                                  *        **                                *
                  1.75                    *                           *      *                                   **
                  1.5                                                  ******                                      *
                  1.25                   *                                                                          **
                  1                     *                                                                             *
                   .75                 *                                                                               ***
                   .5                **                                                                                   ***
                   .25    ***********                                                                                        *
          
           CHANNELS 100   0                                                                                                  1
                     10   0        1         2         3         4         5         6         7         8         9         0
                      1   1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
           CONTENTS   1.                 11223345678899999988765443221111111111122223333444444444444444433332222111111
           *10**  1   0   0000000001234681505297653183799848145791483964333346791469146813567899998765318641964197531087654322
                      0   0000123583003267539488304339899027929647999998500671879261615911069969969960119505050742236063223694
                      0   1247315797649110704725408821516203649039012333618823383230115137101215512101720499659126352424226173
                      0   4557197143534774472257850306737109143583172717457650550628417019558717717855896970455185631419095996
           LOW-EDGE   1.            111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
           *10**  1   0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
           * ENTRIES =        100      * ALL CHANNELS = 0.3249E+02      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.1000E-01      * MEAN VALUE   = 0.4830E+00      * R . M . S = 0.2198E+00
          
           THIS HISTOGRAM IS FILLED ACCORDING TO THE FUNCTION HTFUN1
           HBOOK     ID =       110                                        DATE  17/12/91              NO =   5
                172                                    -
                168                                    I
                164                                    I
                160                                   -I
                156                                   II -
                152                                   II-I
                148                                   I  I-
                144                                 --I   I
                140                                 I     I-
                136                                 I      I
                132                                 I      I
                128                                 I      I-
                124                                -I       I
                120                               -I        I
                116                               I         I
                112                               I         I
                108                               I         I
                104                              -I         I-
                100                              I           I
                 96                              I           I -
                 92                              I           I-I
                 88                             -I             I
                 84                             I              I -                              - -
                 80                             I              I I                        -     I I  -
                 76                             I              I I                        I--  -I I  I
                 72                             I              I I-                       I I- II I  I -
                 68                             I              I-II                    -  I  I-II-I--I-I
                 64                             I                 I                  --I  I            I-
                 60                           - I                 I                  I I -I             I
                 56                           I-I                 I                  I I-I              I -
                 52                           I                   I-               --I                  I-I
                 48                          -I                    I-              I                      I
                 44                          I                      I             -I                      I-  -
                 40                          I                      I-           -I                        I  I
                 36                          I                       I           I                         I--I-
                 32                          I                       I    -     -I                             I
                 28                         -I                       I- - I -  -I                              I- -
                 24                       --I                         I-I I I- I                                I I--
                 20                      -I                             I I-II-I                                I-I I -
                 16                      I                              I-I                                         I-I
                 12                     -I                                                                            I--
                  8                 - --I                                                                               I----
                  4            -----I-I                                                                                     I-
           CHANNELS 100   0                                                                                                  1
                     10   0        1         2         3         4         5         6         7         8         9         0
                      1   1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
           CONTENTS 100                          1111111111111
          
                     10                 112224658012445755432099687543222121221233455666557776678686676664543343222221111
                      1.       21124626818147606828212710478511552225771649871850922032539736953183588893942434650812591167574
           LOW-EDGE   1.            111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
           *10**  1   0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
           * ENTRIES =       5000      * ALL CHANNELS = 0.5000E+04      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.1000E-01      * MEAN VALUE   = 0.4834E+00      * R . M . S = 0.2184E+00
          
           TEST OF HRNDM2
           HBOOK     ID =        20                                        DATE  17/12/91              NO =   6
           CHANNELS 100 U 0                                                                                                  1 O
                     10 N 0        1         2         3         4         5         6         7         8         9         0 V
                      1 D 1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890 E
                      ************************************************************************************************************
             OVE      *                                                                                                          * OVE
                .975  *             ..........................................................................................   *  40
                .95   *           ..................++++++++..................................................................   *  39
                .925  *          ................+++++++++++++++..............................................................   *  38
                .9    *          .............+++++2222222222+++++.....................++++++++++++++++++.....................   *  37
                .875  *         .............+++2223333333333222++++...............++++++++++++++++++++++++++.................   *  36
                .85   *        ............++++2233444444444433222+++...........++++++++2222222222222222++++++++..............   *  35
                .825  *        ...........+++2233445566666655443322++++......+++++++222222233333333332222222++++++............   *  34
                .8    *       ............++223345567778877765543322++++++++++++++2222233333333443333333322222++++++..........   *  33
                .775  *       ...........+++2334567788999998776544322+++++++++++22223333344444444444444333332222+++++.........   *  32
                .75   *       ...........++2234567889AAAAAA98876543322+++++++++2222333344445555555555444433332222+++++........   *  31
                .725  *       ..........+++233456789ABBBBBBA98765443222+++++++222233344445555555555555544443332222+++++.......   *  30
                .7    *       ..........+++23445789AABCCCCBBA9876543222++++++2222333344455555666666555554443332222+++++.......   *  29
                .675  *       ..........+++23445789AABCCCCBBA9876543222++++++2222333344455555666666555554443332222+++++.......   *  28
                .65   *       ..........+++233456789ABBBBBBA98765443222+++++++222233344445555555555555544443332222+++++.......   *  27
                .625  *       ...........++2234567889AAAAAA98876543322+++++++++2222333344445555555555444433332222+++++........   *  26
                .6    *       ...........+++2334567789999998776544322+++++++++++22223333344444444444444333332222+++++.........   *  25
                .575  *       ............++223345567778877765543322++++++++++++++2222233333333443333333322222++++++..........   *  24
                .55   *        ...........+++2233445566666655443322++++......+++++++222222233333333332222222++++++............   *  23
                .525  *        ............+++22233444455444433222++++.........+++++++++2222222222222222++++++++..............   *  22
                .5    *         ............++++2223333333333222++++..............++++++++++++++++++++++++++++................   *  21
                .475  *         .............++++22223333332222++++.................++++++++++++++++++++++++..................   *  20
                .45   *         .............++++22233333333222++++................++++++++++++++++++++++++++.................   *  19
                .425  *        .............+++223334444444433322++++...........+++++++++22222222222222+++++++++..............   *  18
                .4    *        ...........+++23344566777777665543322+++++..+++++++2222223333333333333333222222++++++..........   *  17
                .375  *       ..........+++233456789ABBBBBBA98765443222+++++++222233344445555555555555544443332222+++++.......   *  16
                .35   *      ..........+++2345689BCDFFGHHGGFDCB98754432222222233344455667777888888887777665544433222+++++.....   *  15
                .325  *      ..........++234578ACEGHJKLLLLKJHGECA97654332222333445566778899AAAAAAAAAA99887766554433222++++....   *  14
                .3    *     ..........++2235689BDGIKLNOOOONLKIGECA8754433333334455677899AABBBCCCCCCBBBAA998776554433222++++...   *  13
                .275  *     ..........++2235689BDGIKLNOOOONLKIGECA8754433333334455677899AABBBCCCCCCBBBAA998776554433222++++...   *  12
                .25   *      ..........++234578ACEFHJKLLLLKJHGECA97654332222333445566778899AAAAAAAAAA99887766554433222++++....   *  11
                .225  *      ..........+++2345689ACDEFGGGGFEDCB98754432222222223344455666777888888887776665544433222+++++.....   *  10
                .2    *       ...........++223456789AABBBBAA9876543322++++++++22223333444455555555555544443333222+++++........   *   9
                .175  *        ...........+++2233455666666665543322+++++....+++++++2222222333333333333222222+++++++...........   *   8
                .15   *         .............+++2222333333332222++++...............++++++++++++++++++++++++++.................   *   7
                .125  *           ...............++++++++++++++...............................................................   *   6
                .1    *             ..........................................................................................   *   5
                .075  *               .....................................................................................      *   4
                .05   *                   ..........................................................................             *   3
                .025  *                        ..................                          ..........                            *   2
                      *                                                                                                          *   1
             UND      *                                                                                                          * UND
                      ************************************************************************************************************
           LOW-EDGE   0   0000000000111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
                      0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
          
            *                                                          I         I
            * ENTRIES =     4000                   PLOT       ---------I---------I---------
            * SATURATION  AT=     INFINITY                             I  422.327I
            * SCALE  .,+,2,3,.,., A,B,           STATISTICS   ---------I---------I---------
            * STEP =0.400E-01 * MINIMUM=0.000                          I         I
          
           HIST FILLED WITH HFILL AND HRNDM2
           HBOOK     ID =       210                                        DATE  17/12/91              NO =   7
           CHANNELS 100 U 0                                                                                                  1 O
                     10 N 0        1         2         3         4         5         6         7         8         9         0 V
                      1 D 1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890 E
                      ************************************************************************************************************
             OVE      *                                                                                                          * OVE
                .975  *                       +         +    +                         +          +     + +     + +  +           *  40
                .95   *                           +  +22+ +++     +  +            2 + 2              +   +     2                 *  39
                .925  *                       2 +  2+ +   + +++ ++     +               +    + +      +  ++     +                 *  38
                .9    *                 +       ++2222 +3  3    +2      + +       + + + +4   +++2 2     ++ +   +  +              *  37
                .875  *                  ++ + +2+ 22 2222+++4 +322  2  +     ++2   ++ +3 2+2    +++    3+ ++ ++   +        +     *  36
                .85   *                 ++   2 +2 23 +33 82++  + +       +      3++ +   +3+ 3+2+3+ +   +      +     ++           *  35
                .825  *                + +  +23++ 227+34724 + 3++++2+++ + +  + 3  +   2++ 32+2+ ++22 +6 +2  22+2     +     +     *  34
                .8    *              +  +2+  +4 +2 + 235565622435+3++    ++ +++2 +2+22243 33++2332+24 3++3+ + 2  +     2         *  33
                .775  *           +     +++2+33222223545235+33333 33 +++  2  +  ++2+544 2+3 732+332+3422 4  +++ ++ ++  + 2+      *  32
                .75   *                    2 +53 4525556865446523 ++223  ++3+23 +2+ 3223+4+3++524 3++ 423243+2 2 ++ +       +    *  31
                .725  *                   + 33+63224226465624664 233++  23 23+ + 23 233++52++5+7++34+33232  ++3+++ +  2 +        *  30
                .7    *             +      +23+85+2478547767234432 2 22++ +++2+++4  34+ +24333+247   3+342+2 +++5 3   ++         *  29
                .675  *               +++ 2++25232+545975576+47A4++32+2++ 2+ 2  ++52 + +24533544223 +65323+2+ 2  +2+  +22+       *  28
                .65   *             +++  2+23++2287533442548B324+++ 2+22++++  2+ 2   3 32+242423 5 +4363+++3  22+ 2  3      +    *  27
                .625  *              + +2  423 255285447559545334 2+3+ + +    + ++22+ 233434+34 3+332+ 2+2+2 2+++2+2+++  + +     *  26
                .6    *                     ++322 6363354545424255++ + +++ 2+ 3++++ ++2+33+2228433+4+32+ +2 2   +  2    ++ + +   *  25
                .575  *              + +  ++ ++3222236+272342322 2  +       + 2++  + 3 +4 + 2+2+3+2+3+ 3+ 22+  +  +  2++         *  24
                .55   *                    +2+3++3+6  665+22+ +5+  ++  3++ 2 ++2+ 3   +2 2 2+ 3+  222++ 2 2    2      +          *  23
                .525  *               ++ +3 + +2+4  35+2+22+22+ 2++ +          +  +2  +   ++2+3222+   +2 + + 2  2  +     +       *  22
                .5    *                       + 2 3+ 3332++22  +2+ + ++ +  +   ++    23+  2+2+ 2+ ++2 3 + +              +   +   *  21
                .475  *                    +  ++2 3 +3  2   2+2 +2 ++  +     +    +2 +    +  +   23   2       23 +       +       *  20
                .45   *                  + 2 + +35+2 2++22+++23     2          +    +  3 2  + 2 +++2 2  +  2    +                *  19
                .425  *                   +   3 +32+  233+++++++3++  + 2+    + 3 +2+++ + +   ++ + ++2+ +  2++  +                 *  18
                .4    *                    ++2  435263522594 4 +324  + ++++   ++   +3+3+  332 4+22522 + 5+ ++++2    +       +    *  17
                .375  *             ++  ++3+4+2+4578359944+84B53+463+ + +2+ 2222 2423 4 23+5 +65+2+2 2++232 2 +3  ++++   + +     *  16
                .35   *             2  ++  24223763662898869673+234+2++3++2++ 242324 5353935752246553345 ++52+++5232  2+   +     *  15
                .325  *            + + +++224244796897BAGA8B96944546+32  +2   34224422+569642273485454575A3525+  3+42++ +2 +     *  14
                .3    *              + 3+ +6244456768EGABBGBB79A 46245 32+4+4622344424+676772+359C+355286244243332+5 ++++++ +    *  13
                .275  *            +    +32+3463568EACACCBFB7587557+7532  +3 +54 4533423262597856637+73533A37++432 2++ + + +     *  12
                .25   *             ++++2+ 2433654EE686EA863DA57667+  2 2 22 2+22552++25376356364453476246355535233+  +2 +2+     *  11
                .225  *                 +  52425363599874645A66836+2+ 23 ++322+3+22+5262 63643382436242+32+233+232    + +  2     *  10
                .2    *                   + ++ 44625892363A484243+32 +2           3+2 32 54+444++++76254+332 +   +++ + + +  +    *   9
                .175  *               +     2+  2 23332334432352+5++22  +      +2+ +   2++2 5+ ++424+ +3+  3+  +  ++  + +        *   8
                .15   *            +        +  + 2 22+ 22+2++22+2+ 2      +++   +        23 +2+2+ ++2+    +++ 2+      ++ ++      *   7
                .125  *                 +   + +     + 2+  + +  +                     + +++   2      +   ++              +        *   6
                .1    *                                         + +             +       +    +                + +            +   *   5
                .075  *                    +    +     +                                      +                                   *   4
                .05   *                                                                    +                                     *   3
                .025  *                                                                                                          *   2
                      *                                                                                                          *   1
             UND      *                                                                                                          * UND
                      ************************************************************************************************************
           LOW-EDGE   0   0000000000111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
                      0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
          
            *                                                          I         I
            * ENTRIES =     5000                   PLOT       ---------I---------I---------
            * SATURATION  AT=           31                             I 5000    I
            * SCALE  .,+,2,3,.,., A,B,           STATISTICS   ---------I---------I---------
            * STEP = 1.00     * MINIMUM=0.000                          I         I
          
                                 More booking examples
                                            

                SUBROUTINE HEXAM3
          *.==========>
          *.           MORE BOOKING OPTIONS
          *..=========> ( R.Brun )
          *
          *             Get all histograms saved in example 2
          *
                CALL HROPEN(1,'HEXAM','hexam.dat','U',1024,ISTAT)
                CALL HRIN(0,9999,0)
                CALL HMDIR('HEXAM3','S')
          *
          *             Print an index of all histograms that are now in memory
          *
                CALL HINDEX
          *
          *             Reset hist 110 and 210.  adds more options
          *
                CALL HRESET(110,' ')
                CALL HRESET(210,' ')
                CALL HIDOPT(110,'STAT')
                CALL HBARX(210)
                CALL HBPROX(210,0.)
                CALL HBSLIX(210,3,1000.)
                CALL HBANDY(210,0.1,0.5,0.)
                CALL HIDOPT(0,'1EVL')
          *
          *             New filling
          *
                DO 10 I=1,2000
                   CALL HFILL(110,HRNDM1(10),0.,1.)
                   CALL HRNDM2(20,X,Y)
                   CALL HFILL(210,X,Y,1.)
            10  CONTINUE
          *
          *             Print new contents using specialized printing routines
          *             Same result could be obtained using HISTDO/HPRINT(0)/HPHS.
          *
                CALL HPHIST(110,'HIST',1)
                CALL HPSCAT(210)
                CALL HPHIST(210,'PROX',1)
                CALL HPHIST(210,'BANY',1)
                CALL HPHIST(210,'SLIX',0)
          *
          *             Save all histograms in new directory HEXAM3
          
          *
                CALL HROUT(0,ICYCLE,' ')
                CALL HREND('HEXAM')
                CLOSE (1)
          *
                END
          
                                   Output Generated
                                            

           .............................................................................................................................
           .                                                                                                                           .
           .   HBOOK   HBOOK  CERN            VERSION   4.13       HISTOGRAM AND PLOT INDEX                             17/12/91       .
           .                                                                                                                           .
           .............................................................................................................................
           .                                                                                                                           .
           .  NO                     TITLE                      ID  B/C  ENTRIES DIM   NCHA     LOWER       UPPER       ADDRESS LENGTH .
           .                                                                                                                           .
           .............................................................................................................................
           .                                                                                                                           .
           .                                                                                                                           .
           .   1  TEST OF HRNDM1                               100  32       -1  1  X   100   0.000E+00   0.100E+01       64912    146 .
           .                                                                                                                           .
           .                                                                                                                           .
           .   2  TEST OF HRNDM1                                10  32      100  1  X   100   0.000E+00   0.100E+01       64764    146 .
           .                                                                                                                           .
           .                                                                                                                           .
           .   3  THIS HISTOGRAM IS FILLED ACCORDING TO TH     110  10     5000  1  X   100   0.000E+00   0.100E+01       64605     89 .
           .      E FUNCTION HTFUN1                                                                                                    .
           .                                                                                                                           .
           .   4  TEST OF HRNDM2                               200  32       -1  2  X   100   0.000E+00   0.100E+01       64523   4328 .
           .                                                                        Y    40   0.000E+00   0.100E+01       60218   4296 .
           .                                                                                                                           .
           .   5  TEST OF HRNDM2                                20  32     4000  2  X   100   0.000E+00   0.100E+01       60193   4328 .
           .                                                                        Y    40   0.000E+00   0.100E+01       55888   4296 .
           .                                                                                                                           .
           .   6  HIST FILLED WITH HFILL AND HRNDM2            210   5     5000  2  X   100   0.000E+00   0.100E+01       55858    763 .
           .                                                                        Y    40   0.000E+00   0.100E+01       55123    726 .
           .                                                                                                                           .
           .............................................................................................................................
           MEMORY UTILISATION
                MAXIMUM TOTAL SIZE OF COMMON /PAWC/            80000
           THIS HISTOGRAM IS FILLED ACCORDING TO THE FUNCTION HTFUN1
           HBOOK     ID =       110                                        DATE  17/12/91              NO =   1
                 68                                  -
                 66                                  I  --
                 64                                  I  II
                 62                                  I -II
                 60                                  I I I
          
                 58                                  I I I-
                 56                                 -I-I  I
                 54                                 I     I
                 52                                 I     I
                 50                                 I     I
                 48                               --I     I
                 46                               I       I
                 44                               I       I--- -
                 42                               I          I I
                 40                               I          I I                                -
                 38                              -I          I I                          -     I
                 36                              I           I I                          I    -I-   -
                 34                              I           I-I-                        -I   -I I   I
                 32                            - I              I                        II  -I  I  -I
                 30                            I I              I                        II  I   I  II
                 28                            I I              I-                      -II  I   I  II   -
                 26                            I I               I                     -I I  I   I- II  -I
                 24                            I I               I                     I  I- I    I II -II -
                 22                           -I-I               I                     I   I-I    I II-I I I-
                 20                           I                  I                - - -I          I-I    I-II-
                 18                         - I                  I -              I I I                      I -
                 16                        -I I                  I-I  -       -  -I I-I                      I I
                 14                       -II I                    I- I       I -II I                        I-I
                 12                       I I-I                     I I  -   -I I I-I                          I--
                 10                       I                         I-I- I   II I                                I- - -
                  8                       I                            I-I  -II-I                                 I-I-I-
                  6                     - I                              I--I                                          I
                  4                   - I-I                                                                            I-
                  2             -  -- I-I                                                                               I--
           CHANNELS 100   0                                                                                                  1
                     10   0        1         2         3         4         5         6         7         8         9         0
                      1   1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
           CONTENTS  10                   111123234456566654443432111 1  1   11 11211112233223333322332222122111111
                      1.        1  11 3154368221187867616584443348583959815682574502969683732245966025146893294712079898422
           LOW-EDGE   1.            111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
           *10**  1   0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
           * ENTRIES =       2000      * ALL CHANNELS = 0.2000E+04      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.1000E-01      * MEAN VALUE   = 0.4911E+00      * R . M . S = 0.2207E+00      * NEQUIVAL = 0.2000E+04
          
           HIST FILLED WITH HFILL AND HRNDM2
           HBOOK     ID =       210                                        DATE  17/12/91              NO =   2
           CHANNELS 100 U 0                                                                                                  1 O
                     10 N 0        1         2         3         4         5         6         7         8         9         0 V
                      1 D 1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890 E
                      ************************************************************************************************************
             OVE      *                                                                                                          * OVE
                .975  *                           +        +                          ++    +                                    *  40
                .95   *                           2+      +   +                                 +                                *  39
                .925  *                               +   + +  ++            +        +2+      +                                 *  38
                .9    *                         +      2 ++     +  +                      2 + +     +                   +        *  37
                .875  *                       +    2+++3 2 +2     +             +           +2   + +   +       2                 *  36
                .85   *                      +    +4+ 2++++++++2  + +    +  ++    +  + +  +          2        +             +    *  35
                .825  *               ++         +++4 +2 +4+ +     +  ++   +    +     ++    2+ ++++ +  ++   2            +  +    *  34
                .8    *                    ++   3  2223223+2++3+   2  + +    ++    + 2   +  +2 +2++2    ++  +   +                *  33
                .775  *                 +   + +3 + 2+2 +2+53+ + 2++  + +   +     +++ +2  2     42 + + +      3 +    2            *  32
                .75   *               +     +  22   +3+3 2+32+3 +      +  + + 2 + +2+  2 +++23  3+2+   +       + +               *  31
                .725  *                  +    +  + 43 325+3+ 2+   ++ +  + + +      +++   ++  2+522 3+  + ++  +++  +    +         *  30
                .7    *             + +  +++ ++4++2++2  +2++552  2 ++ +        2  +22    ++2 +32++  ++23  ++  +    2     +       *  29
                .675  *                    +  342223526+24+ +++++++2  +            + + 2+++ 3++2++3+2+  + +3+ +  +2        +     *  28
                .65   *                ++     2223+233+342 2++ 22+     +  ++2 + +++2++   +6 2 +2   ++++ 2++ + ++    + + +        *  27
                .625  *                + ++  ++++2+3++42+2 2+5++2+  + + +     +   +2+ + 2+  22 4+3+2 + + 2 ++ 2 ++ +             *  26
                .6    *                   +  ++ 3+2+32+2 2 2 2 2+ +  +  +     +   +22 ++  + +2  + 2 2 +22 +  ++3                 *  25
                .575  *              +     +  +  +  +++2 2 ++2+2+             +    +   2 +22+   2 2+ 2    + +    ++ +            *  24
                .55   *                   ++    2+ 2+ +2 3   ++               2  +    2 2 +   +3   ++2+ +        ++              *  23
                .525  *                      +  ++ ++2++2+2   +            +      + +  +  +    +  + + +  +   +        +          *  22
                .5    *                      2+ ++ + +++   ++++ ++        +                2 2  ++                       ++      *  21
                .475  *                    ++     + +   +     + +2  +         +       ++    ++ +    + 2 +             +          *  20
                .45   *                       +  +        ++ +                +    +         + +   + +    2   +        +         *  19
                .425  *                    2+ ++  +++++++ 3 +    + +     +    + +    ++     + ++ +++          + +  ++    +       *  18
                .4    *               +   +++2+ ++ 2 3 + 242 23+ 3+++ +  ++    2  +3+ 2+   +    ++ 2+3  3     2  ++ +            *  17
                .375  *                 + ++ ++3+   2232 +42++322++  2    ++   3 + 2  +2+22    +++++2+++4+++   ++2+              *  16
                .35   *                 2  3++ 3232 +2+2633+4 +32 +32   +  ++   +   2++  2+++3+2+2 + 3+45 +2 + + 2++   +         *  15
                .325  *                 +    22+322234+443 555+4252 +3 ++++ 2 ++++33+2+ 2+ 42222+2 +4 532+  33  2 +    +     +   *  14
                .3    *                 +++ +42243+46334+475443334++++ +2 +    +2 2+ ++2+ 2 44++2332++2+2+++  22   +2+  + +      *  13
                .275  *                   ++3  6+255325823646443+2+3+2   2+   23 ++22++ 3+334452 22442 22+ 2+2+2 2 2+++ +        *  12
                .25   *               +   3+22+2+2+95+446335++422++     2    +2 ++++ 2++2223422++242++53++22+++        +         *  11
                .225  *                +  ++ + 22++235347344+45  2 ++  +     + 22+++ 23 33+++++23++++ +3 23++++ +22  +           *  10
                .2    *                      2+ 222++2+4 2++3+ ++ ++++ 22++ + +  + 2 2 222+2+ ++ 2 4+2   + ++ +  ++ +            *   9
                .175  *                    +   +3 +   4++3+ ++  +++    +     +   +  +    +  +    +++   ++++   +3   + +           *   8
                .15   *                     ++    ++ ++++2    + ++  +          ++  + +     + +   + +    ++ 22  +                 *   7
                .125  *                  +   ++ +  2++++  2   +                           +   +         +                        *   6
                .1    *                                       +  +              +                  +                             *   5
                .075  *                               +  +      +                                                                *   4
                .05   *                                                                                                          *   3
                .025  *                                                                                                          *   2
                      *                                                                                                          *   1
             UND      *                                                                                                          * UND
                      ************************************************************************************************************
           LOW-EDGE   0   0000000000111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
                      0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
          
            *                                                          I         I
            * ENTRIES =     2000                   PLOT       ---------I---------I---------
            * SATURATION  AT=           31                             I 2000    I
            * SCALE  .,+,2,3,.,., A,B,           STATISTICS   ---------I---------I---------
            * STEP = 1.00     * MINIMUM=0.000                          I         I
          
           HIST FILLED WITH HFILL AND HRNDM2
           HBOOK     ID =       210             PROJECTION X               DATE  17/12/91              NO =   3
                 76                                    I
                 74                                    I
                 72                                    I
                 70                                    I  I
                 68                                I   0 II
                 66                                I  II II
                 64                                II II II
                 62                                II II I0
                 60                                0I II 0II
                 58                                II 0 IIII
                 56                                I0II IIII I
                 54                                IIII IIII II
                 52                                IIII I  0III
                 50                                 I0I 0  IIII
                 48                             I    I  I  II0I                                I
                 46                             I    I  I  I0I0                                I
                 44                            II    I  I   III                             II I
                 42                            II    I      III                             II 0   I
                 40                            I0I          I I                             II I   I
                 38                            0III            I I                 I      I 00 I I I    I
                 36                            IIII            III                 I      I II I I 0    I
                 34                            II0I            III                 I      I II  IIIII  II
                 32                            I I0            0I0                 0      0 II  I0III  I0
                 30                          II  II            I0I                 I     II     IIIIIIIII
                 28                          II  II            III                 I  II III  I 0I0 0II0I
                 26                          II   I            III                   IIIIIII  I III IIIII
                 24                          00                    I          I      IIII0 0  0 I I I00I      II
                 22                        I II                    I          I   I  I00II I  I   I  II   II  II
                 20                        I II                   I0          II  I I0II0I I  I      II  IIII 00 I
                 18                        0I                     III         0II 0 IIIII                I00IIII I
                 16                       III                     0III  I     I0I I 0I  I                0II0III 0I
                 14                       II0                     I 0I II I   II0II I                    IIII0   II I
                 12                       0 I                     I I0 I0 I I  III  I                    I  II   I0II
                 10                     I I                         III0II0I0I   0                              I I00
                  8                   I 0I                            II 0IIII   I                              0  II  I
                  6                   0II0                            0  I 0I0                                  I  I II0II
                  4                   I0 I                            I    I I                                       00I00I I
                  2                 00 I                                                                             II II0000
           CHANNELS 100   0                                                                                                  1
                     10   0        1         2         3         4         5         6         7         8         9         0
                      1   1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
           CONTENTS  10                   1112234335545656654443331111 11 1   1111131222223233242323222231111111 11 1
                      1.            115475274447031969770012586101693260270696854072602204137731817684481677649975290445442121
           LOW-EDGE   1.            111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
           *10**  1   0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
          
           * ENTRIES =       2000      * ALL CHANNELS = 0.2000E+04      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.1000E-01      * MEAN VALUE   = 0.4847E+00      * R . M . S = 0.2204E+00
          
           HIST FILLED WITH HFILL AND HRNDM2
           HBOOK     ID =       210             BAND Y                     DATE  17/12/91              NO =   4
           BAND Y      NO =   1     XMIN=  0.1000E+00  XMAX=  0.5000E+00
                 88                  --
                 84                  II
                 80                  II
                 76                  II
                 72                 -II-
                 68                 I  I
                 64                 I  I
                 60                -I  I
                 56                I   I-
                 52                I    I
                 48                I    I            -
                 44                I    I           -I-
                 40               -I    I--        -I I
                 36               I       I        I  I- --
                 32               I       I       -I   I-II
                 28               I       I       I       I
                 24              -I       I       I       I--
                 20              I        I-     -I         I
                 16            --I         I  ---I          I-
                 12            I           I -I              I
                  8            I           I-I               I---
                  4          --I                                I-
           CHANNELS  10   0        1         2         3         4
                      1   1234567890123456789012345678901234567890
           CONTENTS  10        1123678875431 11111344443233221
                      1.     3234280076140895066690028139343257552
           LOW-EDGE   1.      111122223333444455556666777788889999
           *10**  1   0   0257025702570257025702570257025702570257
                      0   0505050505050505050505050505050505050505
           * ENTRIES =       1108      * ALL CHANNELS = 0.1108E+04      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.2500E-01      * MEAN VALUE   = 0.4800E+00      * R . M . S = 0.2231E+00
           HIST FILLED WITH HFILL AND HRNDM2
           HBOOK     ID =       210             SLICE X                    DATE  17/12/91              NO =   5
           SLICE X     NO =   1     YMIN=  0.0000E+00  YMAX=  0.3333E+00
                 34                                    I
                 33                                    I
                 32                                    I
                 31                                    I
                 30                                I   I
          
                 29                                I   I  I
                 28                                I  I0  I
                 27                                I  II II
                 26                                I  II III
                 25                                0I II III
                 24                                II II I0I  I
                 23                                II 0IIIIII I
                 22                                II I I0IIIII
                 21                                II I III0III
                 20                                I0II IIIIIII                             I      I
                 19                             I   III II III0                             I      I
                 18                            II   II  0I I0II                             I    I I
                 17                            II I II  I  II0I  I                      I   I    I I
                 16                            IIII I0  I   III II                      I   0II  I 0
                 15                          I I0II  I  I   III II                   I  I   III  III   I
                 14                          I 0III  I  I   II  II                 I I  I IIIII  0II   I
                 13                          I III0  I       I  I0                 I I  0 IIIII  III   I
                 12                          I II0I  I         I0I                 I I  IIIII00  IIII IIII I
                 11                          0 I II            III                 I 0  IIII III I0 I I0II I   I
                 10                         III  II            III             II  0 I  II00 III  I I IIIIIII II
                  9                       I III  I             0I  II  II     III II II  0II IIII I 0I0I00I0I II
                  8                       I III                I  IIII II     IIIIII III III   0I I IIIIIIIII I0 I
                  7                       I 0 0                I  IIII II     I00III  II III   II   III II0I0 0I I
                  6                       0II I                I  I00I 00 I   0III0   0I I     I0   I0I IIIIIIII I III
                  5                       III I                   0II0 IIII  IIII0I I I0        I    I    I III  0IIII
                  4                     III0                      IIII III0 III  II I II        I    I       0  III000  I
                  3                     II I                      I  I   0I I0   I  0  I                     I  II0III  I
                  2                   II00 I                             II 0I      I                        I  0 IIIIII0 I
                  1                   00II                                  I                                   I     00I 0
           CHANNELS 100   0                                                                                                  1
                     10   0        1         2         3         4         5         6         7         8         9         0
                      1   1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
           CONTENTS  10                      1 1111221221222111 11                 1 1  1 11111  111   1
                      1.              11226471745235063882418799235665 6634 236775603165390062286416969199797478253444112 1
           LOW-EDGE   1.            111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
           *10**  1   0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
           * ENTRIES =        751      * ALL CHANNELS = 0.7510E+03      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.1000E-01      * MEAN VALUE   = 0.4820E+00      * R . M . S = 0.2188E+00
          
           HIST FILLED WITH HFILL AND HRNDM2
           HBOOK     ID =       210             SLICE X                    DATE  17/12/91              NO =   6
           SLICE X     NO =   2     YMIN=  0.3333E+00  YMAX=  0.6667E+00
                 25                                  I I
                 24                                  I I I   I                                          I
                 23                                  I III   I                                          I
                 22                                  I IIIII I I                                        I
                 21                                  I IIIII I I                                        I
                 20                                 I0 0IIII I I                                        I
                 19                             II  IIIII0II 0 I                               I        0
                 18                             II  IIII0III III                               I     I  I
                 17                             II IIIIIII00III0 I                 I         I I     I  I
                 16                             II I0IIIIIIIIIII I                 I      I  I I    II  I
                 15                          I  00 II 0 IIIIIIIIII                 I  I   I  I 0   IIII I
                 14                        I IIIII II I I III 0III                 I  I   IIII I   II0II
                 13                        I IIIII 0I I   II0 III0                 0  I   III0 I   IIIII
                 12                        I IIIIIIII I     I I II            I    I  I   0III III I0III
                 11                        I 0II  II        I I 0I            I    II 0I IIIII  III0II0I      I  I
                 10                        0 I00  II        I   II            I   III II II00I  IIIII I0      I  I
                  9                        I III  0             I I           0I  I I II IIII   00III II  I  III II
                  8                       II III  I             I IIII        II  I 0 I0I0 II I II0I  II  I II0I 0I
                  7                       II  II  I               IIII        II  0 I  III II I III    I  I IIII II
                  6                     I I I     I               0III  I  II I0 II I  III    I III      I0II0I0II0 I
                  5                     I 0 I                     I000  IIIII  IIII     0     0          III0I II III  I
                  4                    I0 I 0                     IIIII 0II00  II0   I  I     I          0I0II I0 II0 II I
                  3                    II I I                      IIII I00II   0I   I  I     I          I II   I  0I I0 I
                  2                  II0II  I                         0IIIIII   II   0                   I I    I  II 0I 0I  I
                  1                  00I 0                            I0             I                                I  I0  0
           CHANNELS 100   0                                                                                                  1
                     10   0        1         2         3         4         5         6         7         8         9         0
                      1   1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
           CONTENTS  10                    1 11111 112121111111111                 1  1   1111 1   111111
                      1.             1124150410055936050897739471365552143344 963473821858200355998124109464568648634 23 21  1
           LOW-EDGE   1.            111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
           *10**  1   0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
           * ENTRIES =        707      * ALL CHANNELS = 0.7070E+03      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.1000E-01      * MEAN VALUE   = 0.4943E+00      * R . M . S = 0.2244E+00
           HIST FILLED WITH HFILL AND HRNDM2
           HBOOK     ID =       210             SLICE X                    DATE  17/12/91              NO =   7
           SLICE X     NO =   3     YMIN=  0.6667E+00  YMAX=  0.1000E+01
                 26                                I
                 25                                II     I
          
                 24                                II II II
                 23                                II II II                                    I
                 22                                II II II                                    I
                 21                                0I II II                                    I
                 20                                I0 II I0                                    I
                 19                                II 00 0I                                    I
                 18                                II IIIIIII                                  0
                 17                            I   IIIIIIIIII I                                II
                 16                            I    IIIIIIIIIII                              I II
                 15                            I     IIIII IIII                             II II
                 14                            II    I  0  00II                             II II
                 13                            0I    0  I  III0                             II  0
                 12                            II I  I  I  II0I                    I   I  I I0  I  I
                 11                            II I  I  I  IIII    I               I   I  I 0I  IIII
                 10                           II0 I  I       II I  I               I I I II II  IIIII  I
                  9                           I II0          I  I  I               0 I 0 I0 III  II0I  I
                  8                           I III            IIII0               IIIII II I I  00II  I       I
                  7                           0 III            I0III               II0II 0I   I  III0  0       I
                  6                           I  0I            IIIII  I         I IIIIII II   0  IIIIIII  IIIIII
                  5                   I    II I  I             0I00   II  I III I I 0I0  I I  I     IIIIIIIIIII0  I
                  4                   I  I III   I             I II II0II IIIIII0 0 I I I  I  I      00 II00000I IIII   II  I
                  3                   0  I 00I                 I II III0I 0I000II I I I I  0         II 00IIIIII I0II   II  I
                  2                 I III0III0                      00II0II0III0III     0  I         II IIIIIII I0I00 II00 I0
                  1                 0  00I0  I                      II  I0 I   I 0      I                       0I II 00II 0I
           CHANNELS 100   0                                                                                                  1
                     10   0        1         2         3         4         5         6         7         8         9         0
                      1   1234567890123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890
           CONTENTS  10                        11  221111121111                             11 11
                      1.            1 3112133273069103994904423575582243213233324149575927931268388974473344444512322 1122 12
           LOW-EDGE   1.            111111111122222222223333333333444444444455555555556666666666777777777788888888889999999999
           *10**  1   0   0123456789012345678901234567890123456789012345678901234567890123456789012345678901234567890123456789
           * ENTRIES =        542      * ALL CHANNELS = 0.5420E+03      * UNDERFLOW = 0.0000E+00      * OVERFLOW = 0.0000E+00
           * BIN WID = 0.1000E-01      * MEAN VALUE   = 0.4760E+00      * R . M . S = 0.2167E+00