aboutsummaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/quad_3.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/quad_3.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/quad_3.f9027
1 files changed, 27 insertions, 0 deletions
diff --git a/gcc/testsuite/gfortran.dg/quad_3.f90 b/gcc/testsuite/gfortran.dg/quad_3.f90
new file mode 100644
index 00000000000..e29dac229b8
--- /dev/null
+++ b/gcc/testsuite/gfortran.dg/quad_3.f90
@@ -0,0 +1,27 @@
+! { dg-do run }
+!
+! I/O test for REAL(16)
+!
+! Contributed by Dominique d'Humieres
+!
+program test_qp
+ use iso_fortran_env, only: real_kinds
+ implicit none
+ integer, parameter :: QP = real_kinds(ubound(real_kinds,dim=1))
+ real(kind=qp) :: a,b(2), c
+ integer :: exponent
+ character(len=180) :: tmp
+
+ ! Run this only with libquadmath; assume that all those systems
+ ! have also kind=10.
+ if (size (real_kinds) >= 4 .and. real_kinds(3) == 10 .and. qp == 16) then
+ exponent = 4000
+ b(:) = huge (1.0_qp)/10.0_qp**exponent
+! print *, 'real(16) big value: ', b(1)
+ write (tmp, *) b
+ read (tmp, *) a, c
+! print *, 'same value read again: ', a, c
+! print *, 'difference: looks OK now ', a-b(1)
+ if (a-b(1) /= 0.0_qp .or. c-b(1) /= 0.0_qp) call abort()
+ end if
+end program test_qp