Skip to content

Commit 3591034

Browse files
Release/1.1.1 (#96)
1 parent f97c924 commit 3591034

File tree

7 files changed

+31
-15
lines changed

7 files changed

+31
-15
lines changed

CHANGELOG.md

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -4,6 +4,10 @@ All notable changes to this project will be documented in this file.
44

55
The format is based on [Keep a Changelog](https://keepachangelog.com/en/1.0.0/).
66

7+
## [1.1.1] - 2024-09-30
8+
- Implement variable length character strings (#94)
9+
- For example, `01 WS-VAR PIC X(10) VARYING.`
10+
711
## [1.1.0] - 2024-08-30
812

913
### Added

ChangeLog

Lines changed: 5 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,8 @@
1-
2023-08-30 OSS Consortium <[email protected]>
1+
2024-09-30 OSS Consortium <[email protected]>
2+
3+
* Open COBOL ESQL 4J v1.1.1 released.
4+
5+
2024-08-30 OSS Consortium <[email protected]>
26

37
* Open COBOL ESQL 4J v1.1.0 released.
48

NEWS

Lines changed: 8 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,13 @@
11
NEWS - user visible changes -*- outline -*-
22

3+
* Open COBOL ESQL 4J 1.1.1
4+
5+
** New Features
6+
(1) Implement variable length character strings.
7+
(a) For example, `01 WS-VAR PIC X(10) VARYING.`
8+
9+
-----------------------------------------------------------------------
10+
311
* Open COBOL ESQL 4J 1.1.0
412

513
** New Features

configure

Lines changed: 10 additions & 10 deletions
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
#! /bin/sh
22
# Guess values for system-dependent variables and create Makefiles.
3-
# Generated by GNU Autoconf 2.71 for Open COBOL ESQL 4J 1.1.0.
3+
# Generated by GNU Autoconf 2.71 for Open COBOL ESQL 4J 1.1.1.
44
#
55
# Report bugs to <[email protected]>.
66
#
@@ -621,8 +621,8 @@ MAKEFLAGS=
621621
# Identity of this package.
622622
PACKAGE_NAME='Open COBOL ESQL 4J'
623623
PACKAGE_TARNAME='open-cobol-esql-4j'
624-
PACKAGE_VERSION='1.1.0'
625-
PACKAGE_STRING='Open COBOL ESQL 4J 1.1.0'
624+
PACKAGE_VERSION='1.1.1'
625+
PACKAGE_STRING='Open COBOL ESQL 4J 1.1.1'
626626
PACKAGE_BUGREPORT='[email protected]'
627627
PACKAGE_URL=''
628628

@@ -1364,7 +1364,7 @@ if test "$ac_init_help" = "long"; then
13641364
# Omit some internal or obsolete options to make the list less imposing.
13651365
# This message is too long to be a string in the A/UX 3.1 sh.
13661366
cat <<_ACEOF
1367-
\`configure' configures Open COBOL ESQL 4J 1.1.0 to adapt to many kinds of systems.
1367+
\`configure' configures Open COBOL ESQL 4J 1.1.1 to adapt to many kinds of systems.
13681368
13691369
Usage: $0 [OPTION]... [VAR=VALUE]...
13701370
@@ -1436,7 +1436,7 @@ fi
14361436

14371437
if test -n "$ac_init_help"; then
14381438
case $ac_init_help in
1439-
short | recursive ) echo "Configuration of Open COBOL ESQL 4J 1.1.0:";;
1439+
short | recursive ) echo "Configuration of Open COBOL ESQL 4J 1.1.1:";;
14401440
esac
14411441
cat <<\_ACEOF
14421442
@@ -1555,7 +1555,7 @@ fi
15551555
test -n "$ac_init_help" && exit $ac_status
15561556
if $ac_init_version; then
15571557
cat <<\_ACEOF
1558-
Open COBOL ESQL 4J configure 1.1.0
1558+
Open COBOL ESQL 4J configure 1.1.1
15591559
generated by GNU Autoconf 2.71
15601560
15611561
Copyright (C) 2021 Free Software Foundation, Inc.
@@ -2048,7 +2048,7 @@ cat >config.log <<_ACEOF
20482048
This file contains any messages produced by compilers while
20492049
running configure, to aid debugging if configure makes a mistake.
20502050
2051-
It was created by Open COBOL ESQL 4J $as_me 1.1.0, which was
2051+
It was created by Open COBOL ESQL 4J $as_me 1.1.1, which was
20522052
generated by GNU Autoconf 2.71. Invocation command line was
20532053
20542054
$ $0$ac_configure_args_raw
@@ -3320,7 +3320,7 @@ fi
33203320

33213321
# Define the identity of the package.
33223322
PACKAGE='open-cobol-esql-4j'
3323-
VERSION='1.1.0'
3323+
VERSION='1.1.1'
33243324

33253325

33263326
printf "%s\n" "#define PACKAGE \"$PACKAGE\"" >>confdefs.h
@@ -15495,7 +15495,7 @@ cat >>$CONFIG_STATUS <<\_ACEOF || ac_write_fail=1
1549515495
# report actual input values of CONFIG_FILES etc. instead of their
1549615496
# values after options handling.
1549715497
ac_log="
15498-
This file was extended by Open COBOL ESQL 4J $as_me 1.1.0, which was
15498+
This file was extended by Open COBOL ESQL 4J $as_me 1.1.1, which was
1549915499
generated by GNU Autoconf 2.71. Invocation command line was
1550015500
1550115501
CONFIG_FILES = $CONFIG_FILES
@@ -15563,7 +15563,7 @@ ac_cs_config_escaped=`printf "%s\n" "$ac_cs_config" | sed "s/^ //; s/'/'\\\\\\\\
1556315563
cat >>$CONFIG_STATUS <<_ACEOF || ac_write_fail=1
1556415564
ac_cs_config='$ac_cs_config_escaped'
1556515565
ac_cs_version="\\
15566-
Open COBOL ESQL 4J config.status 1.1.0
15566+
Open COBOL ESQL 4J config.status 1.1.1
1556715567
configured by $0, generated by GNU Autoconf 2.71,
1556815568
with options \\"\$ac_cs_config\\"
1556915569

configure.ac

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,7 @@
22
# Process this file with autoconf to produce a configure script.
33

44
AC_PREREQ([2.69])
5-
AC_INIT([Open COBOL ESQL 4J], [1.1.0], [[email protected]])
5+
AC_INIT([Open COBOL ESQL 4J], [1.1.1], [[email protected]])
66
AC_CONFIG_SRCDIR([config.h.in])
77
AC_CONFIG_HEADERS([config.h])
88
AM_INIT_AUTOMAKE

ocesql/ocesql.c

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -274,7 +274,7 @@ char *cb_get_env(char *filename, int num) {
274274

275275
void version(void) {
276276
printf("Open Cobol ESQL 4J\n");
277-
printf("Version 1.1.0\n");
277+
printf("Version 1.1.1\n");
278278
printf("\n");
279279
printf("Tokyo System House Co., Ltd. <[email protected]>\n");
280280
}

tests/package.m4

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11
# Signature of the current package.
22
m4_define([AT_PACKAGE_NAME], [Open COBOL ESQL 4J])
33
m4_define([AT_PACKAGE_TARNAME], [open-cobol-esql-4j])
4-
m4_define([AT_PACKAGE_VERSION], [1.1.0])
5-
m4_define([AT_PACKAGE_STRING], [Open COBOL ESQL 4J 1.1.0])
4+
m4_define([AT_PACKAGE_VERSION], [1.1.1])
5+
m4_define([AT_PACKAGE_STRING], [Open COBOL ESQL 4J 1.1.1])
66
m4_define([AT_PACKAGE_BUGREPORT], [[email protected]])

0 commit comments

Comments
 (0)