Your message dated Sat, 16 Jun 2007 16:32:04 +0000
with message-id <[EMAIL PROTECTED]>
and subject line Bug#405597: fixed in open-cobol 0.33~cvs20070616-1
has caused the attached Bug report to be marked as done.

This means that you claim that the problem has been dealt with.
If this is not the case it is now your responsibility to reopen the
Bug report if necessary, and/or fix the problem forthwith.

(NB: If you are a system administrator and have no idea what I am
talking about this indicates a serious mail system misconfiguration
somewhere.  Please contact me immediately.)

Debian bug tracking system administrator
(administrator, Debian Bugs database)

--- Begin Message ---
Package: open-cobol
Version: 0.32-3

Attempting to compile a simple test program produces an internal
compiler error.  I've run this through one or two other compilers
without problems.  Best I can tell, the syntax is all legal.
I've commented out a few non-essential bits, but it doesn't seem to
make any difference.  I also tried making the records fixed instead
of varying length, to no avail.

===============================================================================
sample run:
===============================================================================

yagi 7410 $ cobc -C -Wall -std=mvs test.cob
test.cob: In paragraph '210-COPY':
test.cob:77: warning: READ statement not terminated by END-READ
test.cob:80: warning: IF statement not terminated by END-IF
Unexpected tree tag 1413632580
Aborting compile of test.cob at line 84
codegen.c:802: internal compiler error
Abort (core dumped)

===============================================================================
test.cob:
===============================================================================

       IDENTIFICATION DIVISION.

           PROGRAM-ID.      DRBTEST.
      *    AUTHOR.          Dennis Boone.
      *    DATE-WRITTEN.    15Sep2006.

       ENVIRONMENT DIVISION.

      *    CONFIGURATION SECTION.

      *        SOURCE-COMPUTER. VAX.
      *        OBJECT-COMPUTER. VAX.

           INPUT-OUTPUT SECTION.

               FILE-CONTROL.

                   SELECT TESTFILEI
                       ASSIGN TO INFILE
                       ORGANIZATION IS SEQUENTIAL.

                   SELECT TESTFILEO
                       ASSIGN TO OUTFILE
                       ORGANIZATION IS SEQUENTIAL.

       DATA DIVISION.

           FILE SECTION.

               FD TESTFILEI
                   RECORD IS VARYING IN SIZE
                       FROM 0 TO 256 CHARACTERS
                       DEPENDING ON REC-LEN.
      *            LABEL RECORDS ARE OMITTED
      *            DATA RECORD IS TFIREC.
               01 TFIREC.
                  03 ISTR                   PIC X(256).

               FD TESTFILEO
                   RECORD IS VARYING IN SIZE
                       FROM 0 TO 256 CHARACTERS
                       DEPENDING ON REC-LEN.
      *            LABEL RECORDS ARE OMITTED
      *            DATA RECORD IS TFOREC.
               01 TFOREC.
                  03 OSTR                   PIC X(256). 

           WORKING-STORAGE SECTION.

               77 TFI-STATUS                PIC 9.
               77 REC-CNT                   PIC 9(9).
               77 REC-LEN                   PIC 9(9).

       PROCEDURE DIVISION.

       100-MAIN.

           PERFORM 200-FILE-SETUP.
           MOVE 0 TO TFI-STATUS.
           PERFORM 210-COPY
               VARYING REC-CNT FROM 0 BY 1
               UNTIL TFI-STATUS IS GREATER THAN 0.
           CLOSE TESTFILEI.
           CLOSE TESTFILEO.
           DISPLAY REC-CNT, ' RECORDS COPIED.'.
           EXIT PROGRAM.

       200-FILE-SETUP.

           OPEN INPUT TESTFILEI.
           OPEN OUTPUT TESTFILEO.

       210-COPY.

           MOVE SPACES TO ISTR.
           MOVE SPACES TO OSTR.
           READ TESTFILEI RECORD
               AT END MOVE 1 TO TFI-STATUS.
           MOVE ISTR TO OSTR.
           IF TFI-STATUS = 0
               WRITE TFOREC.

       END PROGRAM DRBTEST.

===============================================================================
test.c:
===============================================================================

/* Generated from test.cob by cobc 0.32 */

#include <stdio.h>
#include <stdlib.h>
#include <string.h>
#include <math.h>
#include <libcob.h>

#include "test.c.h"

static int DRBTEST_ (int);

int
DRBTEST ()
{
  return DRBTEST_ (0);
}

static int
DRBTEST_ (int entry)
{
  static int initialized = 0;
  static cob_module module = { NULL, NULL, 0, '.', '$', ',', 1, 0, 0};


  /* Files */

  static cob_file h_TESTFILEI = {0, 1, 0, 0, 0, &c_20, 


--- End Message ---
--- Begin Message ---
Source: open-cobol
Source-Version: 0.33~cvs20070616-1

We believe that the bug you reported is fixed in the latest version of
open-cobol, which is due to be installed in the Debian FTP archive:

libcob1-dev_0.33~cvs20070616-1_i386.deb
  to pool/main/o/open-cobol/libcob1-dev_0.33~cvs20070616-1_i386.deb
libcob1_0.33~cvs20070616-1_i386.deb
  to pool/main/o/open-cobol/libcob1_0.33~cvs20070616-1_i386.deb
open-cobol_0.33~cvs20070616-1.diff.gz
  to pool/main/o/open-cobol/open-cobol_0.33~cvs20070616-1.diff.gz
open-cobol_0.33~cvs20070616-1.dsc
  to pool/main/o/open-cobol/open-cobol_0.33~cvs20070616-1.dsc
open-cobol_0.33~cvs20070616-1_i386.deb
  to pool/main/o/open-cobol/open-cobol_0.33~cvs20070616-1_i386.deb
open-cobol_0.33~cvs20070616.orig.tar.gz
  to pool/main/o/open-cobol/open-cobol_0.33~cvs20070616.orig.tar.gz



A summary of the changes between this version and the previous one is
attached.

Thank you for reporting the bug, which will now be closed.  If you
have further comments please address them to [EMAIL PROTECTED],
and the maintainer will reopen the bug report if appropriate.

Debian distribution maintenance software
pp.
Bart Martens <[EMAIL PROTECTED]> (supplier of updated open-cobol package)

(This message was generated automatically at their request; if you
believe that there is a problem with it please contact the archive
administrators by mailing [EMAIL PROTECTED])


-----BEGIN PGP SIGNED MESSAGE-----
Hash: SHA1

Format: 1.7
Date: Sat, 16 Jun 2007 16:24:46 +0200
Source: open-cobol
Binary: libcob1-dev libcob1 open-cobol
Architecture: source i386
Version: 0.33~cvs20070616-1
Distribution: unstable
Urgency: low
Maintainer: Bart Martens <[EMAIL PROTECTED]>
Changed-By: Bart Martens <[EMAIL PROTECTED]>
Description: 
 libcob1    - COBOL compiler - runtime library
 libcob1-dev - COBOL compiler - development files
 open-cobol - COBOL compiler
Closes: 405597
Changes: 
 open-cobol (0.33~cvs20070616-1) unstable; urgency=low
 .
   * New upstream version from upstream cvs.  Closes: #405597.
   * debian/README.Debian-source: Added.
   * debian/control: Replaced libdb4.3-dev by libdb4.5-dev.
   * debian/copyright: Updated.
Files: 
 b66e44d985fa77b7737399a5b3ac0c66 731 devel optional 
open-cobol_0.33~cvs20070616-1.dsc
 9db1fe2ff6113576f778fb3dac402759 791253 devel optional 
open-cobol_0.33~cvs20070616.orig.tar.gz
 146a6c187cccf01549acf2dbc99d91f0 6634 devel optional 
open-cobol_0.33~cvs20070616-1.diff.gz
 213dcff0de0672fe1c543ec25b980b97 174756 devel optional 
open-cobol_0.33~cvs20070616-1_i386.deb
 8380ee9196771dc7c28d98e92c8a055b 74724 libs optional 
libcob1_0.33~cvs20070616-1_i386.deb
 0925ff5e0641f15a4ae292b62831e082 95128 libdevel optional 
libcob1-dev_0.33~cvs20070616-1_i386.deb

-----BEGIN PGP SIGNATURE-----
Version: GnuPG v1.4.6 (GNU/Linux)

iD8DBQFGdA5DbMaawmho9B8RAjUeAJ4vP5ZJ6UgX88rSHCCybSPUwXhuYQCfb4lX
HFhahx1zbheOXxy99SqzgzE=
=WxxZ
-----END PGP SIGNATURE-----


--- End Message ---

Reply via email to