c - 如何在 Cobol 中打印变量名称

标签 c variables cobol

我正在尝试将 cobol 程序中的变量名称传递给 C 函数。

   01 Message.
         03 varA         PIC X(32).
         03 varB         PIC X(32).

考虑到这个函数会在很多程序中使用,并且变量 Message 的结构每次都会不同,我如何将变量的名称传递给 C 函数? 我已经考虑制作另一个组数据项来包含变量名称,但这对我来说不是一个好的解决方案。

我在 AIX 上使用 Microfocus Server Express v5.1。

最佳答案

how can i pass to the C function the names of the variables?

无法使用 CALL USING 直接传递变量名;至少,没有一个比一组数据项更好。

我在这里所做的是使用STRING创建一个类似JSON的对象。带有 REPLACE 的声明语句传递名称/值对。我选择这种方法是因为有很多开源库可能从 C 调用。解码JSON对象。它在文本长度和要传递的变量数量方面也非常灵活。

[编辑。更改了代码以放置所有 STRING REPLACE中的语句数据项陈述。更改了一些名称以反射(reflect)“名称/值”配对。删除了嵌套程序的字符串长度代码。]

   program-id. call-c.
   data division.
   working-storage section.
   1 msg.
    2 varA pic x(32) value "Message 1".
    2 varB pic x(32) value "Message 2".
   1 lengths binary.
    2 len-1 pic 9(4).
    2 len-2 pic 9(4).
   replace
       ==name-1== by =="varA"==
           ==value-1== by ==varA(1:len-1)==
       ==name-2== by =="varB"==
           ==value-2== by ==varB(1:len-2)==
       ==newline== by ==x"0a"==
       .
   1 json-string pic x(256).
   procedure division.
   begin.
       compute len-1 = function length (varA)
       call "rtrim-len" using varA len-1

       compute len-2 = function length (varB)
       call "rtrim-len" using varB len-2

       string
           "{" newline
               quote name-1 quote ": "
                 quote value-1 quote "," newline
               quote name-2 quote ": "
                 quote value-2 quote newline
           "}" x"00"
           delimited size into json-string
       call "c_prog" using
           by reference json-string
       stop run
       .

   program-id. rtrim-len.
   data division.
   linkage section.
   1 str pic x(256).
   1 str-len binary pic 9(4).
   procedure division using str str-len.
   begin.
       perform varying str-len from str-len by -1
       until str-len < 1 or str (str-len:1) not = space
           continue
       end-perform
       exit program
       .
   end program rtrim-len.
   end program call-c.

一个 COBOL 程序来替代被调用的 C程序。

   program-id. "c_prog".
   data division.
   working-storage section.
   1 json-string-count binary pic 9(4).
   1 json-string-pos binary pic 9(4).
   1 json-text-count binary pic 9(4).
   1 json-text pic x(64).
   linkage section.
   1 json-string pic x(256).
   procedure division using json-string.
   begin.
       move 0 to json-string-count
       inspect json-string tallying
           json-string-count for characters before x"00"
       move 1 to json-string-pos
       perform until json-string-pos > json-string-count
           unstring json-string delimited x"0a" or x"00"
               into json-text count json-text-count
               pointer json-string-pos
           display json-text (1:json-text-count)
       end-perform
       exit program
       .
   end program "c_prog".

输出:

{
"varA": "Message 1",
"varB": "Message 2"
}

如果 TRIM函数可用,不需要长度计算、数据项和嵌套程序,REPLACE语句变为,

   replace
       ==name-1== by =="varA"==
           ==value-1== by ==trim(varA)==
       ==name-2== by =="varB"==
           ==value-2== by ==trim(varB)==
       ==newline== by ==x"0a"==
       .

关于c - 如何在 Cobol 中打印变量名称,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/54232695/

相关文章:

c - 在混合 fortran/C 程序中出现奇怪的崩溃

c++ - 如何在使用 x 进行计算时保留原始 x 的值?

cobol - 与 DDNAME 关联的 PDS 成员列表

cobol - 在我的 COBOL 作业方面需要帮助

c - Goldberg 的 log1p 与 gsl_log1p

C++ -- 返回 x,y;重点是什么?

PHP变量初始化到数据库查询

asp.net - 将动态变量传递给 UserControl 属性

db2 - 大型机 - 更改的文件名的扩展名后缀的名称是什么?

c - 将地址 int "p = &i"分配给指针 "*p = i"时, "i"和 "p"之间是否有任何差异