Loading...
Select Version
The ASIN function returns a numeric value in radians that approximates the arcsine of argument-1.
The type of this function is numeric.
Format
FUNCTION ASIN (argument-1)
Arguments
argument-1 must be class "numeric".
The value of argument-1 must be greater than or equal to
-1 and less than or equal to +1.
Returned values
The returned value is the approximation of the arcsine of argument-1 and is greater than or equal to
-pi/2 and less than or equal to +pi/2.The error default value is
-2.
See also: SIN, COS, ACOS, TAN, ATAN
Example 9-3
...
DATA DIVISION.
WORKING-STORAGE SECTION.
01 AN PIC S9V999 VALUE -0.45.
01 R PIC 9V99.
01 RES PIC -9.99.
PROCEDURE DIVISION.
P1 SECTION.
MAIN.
COMPUTE R = FUNCTION ASIN (AN).
MOVE R TO RES.
DISPLAY RES UPON T.
STOP RUN.
Result: 0.46