How to resolve the algorithm Guess the number step by step in the COBOL programming language

Published on 12 May 2024 09:40 PM

How to resolve the algorithm Guess the number step by step in the COBOL programming language

Table of Contents

Problem Statement

Write a program where the program chooses a number between   1   and   10. A player is then prompted to enter a guess.   If the player guesses wrong,   then the prompt appears again until the guess is correct. When the player has made a successful guess the computer will issue a   "Well guessed!"   message,   and the program exits. A   conditional loop   may be used to repeat the guessing until the user is correct.

Let's start with the solution:

Step by Step solution about How to resolve the algorithm Guess the number step by step in the COBOL programming language

Source code in the cobol programming language

       IDENTIFICATION DIVISION.
       PROGRAM-ID. Guess-The-Number.

       DATA DIVISION.
       WORKING-STORAGE SECTION.
       01  Random-Num PIC 99.
       01  Guess      PIC 99.

       PROCEDURE DIVISION.
           COMPUTE Random-Num = 1 + (FUNCTION RANDOM * 10)
           DISPLAY "Guess a number between 1 and 10:"

           PERFORM FOREVER
               ACCEPT Guess

               IF Guess = Random-Num
                   DISPLAY "Well guessed!"
                   EXIT PERFORM
               ELSE
                   DISPLAY "That isn't it. Try again."
               END-IF
           END-PERFORM
           
           GOBACK
           .


  

You may also check:How to resolve the algorithm HTTPS step by step in the Mathematica / Wolfram Language programming language
You may also check:How to resolve the algorithm Command-line arguments step by step in the Smalltalk programming language
You may also check:How to resolve the algorithm Loops/Do-while step by step in the SAS programming language
You may also check:How to resolve the algorithm Playing cards step by step in the Run BASIC programming language
You may also check:How to resolve the algorithm Colorful numbers step by step in the Mathematica/Wolfram Language programming language