Programming Fundamentals/Variables/COBOL
variables.cbl
edit*> This program converts a Fahrenheit temperature to Celsius.
*>
*> 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. VARIABLES.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 FAHRENHEIT PIC 999V99.
01 CELSIUS PIC ZZ9.99.
PROCEDURE DIVISION.
DISPLAY "Enter Fahrenheit temperature:".
ACCEPT FAHRENHEIT.
COMPUTE CELSIUS = (FAHRENHEIT - 32) * 5 / 9.
DISPLAY FAHRENHEIT "° Fahrenheit is " CELSIUS "° Celsius".
Try It
editCopy and paste the code above into one of the following free online development environments or use your own COBOL compiler / interpreter / IDE.