
- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Email to a Friend
- Report Inappropriate Content
We're running 32-bit AcuCOBOL 9.2.1 for Linux. The RMNET library doesn't seem to have been included. Am I looking in the wrong place?
I would expect to find it in the AcuCOBOL 9.2.1 lib directory, as librmnet.so. But there is no file whose name contains rmnet in that directory.
Thanks.
Accepted Solutions

- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Email to a Friend
- Report Inappropriate Content
Which Linux 32 bit archive do you have (intel or PowerPC), in the shared library archive acucob921pmk60sh.tar.gz in the lib directory is librmnet.so. I hope this helps.

- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Email to a Friend
- Report Inappropriate Content
Which Linux 32 bit archive do you have (intel or PowerPC), in the shared library archive acucob921pmk60sh.tar.gz in the lib directory is librmnet.so. I hope this helps.

- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Email to a Friend
- Report Inappropriate Content
RE: RMNet library missing in Linux
It's the static library build: acucob921pmk60st.tar.gz
Would that mean there's no need to preload the rmnet library (with runcbil -y)?

- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Email to a Friend
- Report Inappropriate Content
RE: RMNet library missing in Linux
correction: runcbl -y

- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Email to a Friend
- Report Inappropriate Content
RE: RMNet library missing in Linux
Looks that way. The following test program compiles and runs without errors.
IDENTIFICATION DIVISION.
PROGRAM-ID. TEST.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 W-RESPONSE-STATUS PIC 9(3) VALUE ZERO.
01 W-WEBSVC-EXCEPTION-FLAG PIC X(1) VALUE "N".
88 W-WEBSVC-EXCEPTION VALUE "Y" FALSE "N".
01 W-WEBSVC-ERR-CODE PIC 9(3) VALUE ZERO.
01 W-WEBSVC-ERR-MSG PIC X(512) VALUE SPACE.
PROCEDURE DIVISION.
SET W-WEBSVC-EXCEPTION TO FALSE
MOVE ZERO TO W-WEBSVC-ERR-CODE
MOVE SPACES TO W-WEBSVC-ERR-MSG
* Initialize the RMNET session.
CALL "NetInit" GIVING W-RESPONSE-STATUS
ON EXCEPTION
SET W-WEBSVC-EXCEPTION TO TRUE
MOVE W-RESPONSE-STATUS TO W-WEBSVC-ERR-CODE
MOVE "An error occurred when calling NetInit."
TO W-WEBSVC-ERR-MSG
GOBACK 1
END-CALL
GOBACK 0.