Programming Fundamentals/Functions/COBOL
Appearance
functions.cbl
[edit | edit source]*> This program asks the user for a Fahrenheit temperature,
*> converts the given temperature to Celsius,
*> and displays the results.
*>
*> References:
*> https://www.mathsisfun.com/temperature-conversion.html
*> https://www.tutorialspoint.com/cobol/index.htm
*> https://open-cobol.sourceforge.io/doc/gnucobol.html
IDENTIFICATION DIVISION.
PROGRAM-ID. FUNCTIONS.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 FAHRENHEIT PIC 999V99.
01 CELSIUS PIC ZZ9.99.
PROCEDURE DIVISION.
MAIN.
PERFORM GET-FAHRENHEIT.
PERFORM CALCULATE-CELSIUS.
PERFORM DISPLAY-RESULT.
STOP RUN.
GET-FAHRENHEIT.
DISPLAY "Enter Fahrenheit temperature:".
ACCEPT FAHRENHEIT.
CALCULATE-CELSIUS.
COMPUTE CELSIUS = (FAHRENHEIT - 32) * 5 / 9.
DISPLAY-RESULT.
DISPLAY FAHRENHEIT "° Fahrenheit is " CELSIUS "° Celsius".
Try It
[edit | edit source]Copy and paste the code above into one of the following free online development environments or use your own COBOL compiler / interpreter / IDE.