aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.8/gcc/testsuite/gfortran.dg/sizeof.f90
diff options
context:
space:
mode:
authorDan Albert <danalbert@google.com>2015-10-13 16:28:19 -0700
committerDan Albert <danalbert@google.com>2015-10-13 16:28:19 -0700
commita8c075f72b231c37823661ba0d7d082a21cd39d9 (patch)
tree395aa3b848d56037292e50466643453485073018 /gcc-4.8/gcc/testsuite/gfortran.dg/sizeof.f90
parent5aff2e0142aca13849b4e51de503e71d5010efa6 (diff)
downloadtoolchain_gcc-a8c075f72b231c37823661ba0d7d082a21cd39d9.tar.gz
toolchain_gcc-a8c075f72b231c37823661ba0d7d082a21cd39d9.tar.bz2
toolchain_gcc-a8c075f72b231c37823661ba0d7d082a21cd39d9.zip
Remove gcc-4.8.
Change-Id: Iee9c6985c613f58c82e33a91722d371579eb290f
Diffstat (limited to 'gcc-4.8/gcc/testsuite/gfortran.dg/sizeof.f90')
-rw-r--r--gcc-4.8/gcc/testsuite/gfortran.dg/sizeof.f9088
1 files changed, 0 insertions, 88 deletions
diff --git a/gcc-4.8/gcc/testsuite/gfortran.dg/sizeof.f90 b/gcc-4.8/gcc/testsuite/gfortran.dg/sizeof.f90
deleted file mode 100644
index fbe6b868f..000000000
--- a/gcc-4.8/gcc/testsuite/gfortran.dg/sizeof.f90
+++ /dev/null
@@ -1,88 +0,0 @@
-! { dg-do run }
-! Verify that the sizeof intrinsic does as advertised
-subroutine check_int (j)
- INTEGER(4) :: i, ia(5), ib(5,4), ip, ipa(:)
- target :: ib
- POINTER :: ip, ipa
- logical :: l(6)
- integer(8) :: jb(5,4)
-
- if (sizeof (jb) /= 2*sizeof (ib)) call abort
-
- if (sizeof(j) == 4) then
- if (sizeof (j) /= sizeof (i)) call abort
- else
- if (sizeof (j) /= 2 * sizeof (i)) call abort
- end if
-
- ipa=>ib(2:3,1)
-
- l = (/ sizeof(i) == 4, sizeof(ia) == 20, sizeof(ib) == 80, &
- sizeof(ip) == 4, sizeof(ipa) == 8, sizeof(ib(1:5:2,3)) == 12 /)
-
- if (any(.not.l)) call abort
-
- if (sizeof(l) /= 6*sizeof(l(1))) call abort
-end subroutine check_int
-
-subroutine check_real (x, y)
- dimension y(5)
- real(4) :: r(20,20,20), rp(:,:)
- target :: r
- pointer :: rp
- double precision :: d(5,5)
- complex(kind=4) :: c(5)
-
- if (sizeof (y) /= 5*sizeof (x)) call abort
-
- if (sizeof (r) /= 8000*4) call abort
- rp => r(5,2:10,1:5)
- if (sizeof (rp) /= 45*4) call abort
- rp => r(1:5,1:5,1)
- if (sizeof (d) /= 2*sizeof (rp)) call abort
- if (sizeof (c(1)) /= 2*sizeof(r(1,1,1))) call abort
-end subroutine check_real
-
-subroutine check_derived ()
- type dt
- integer i
- end type dt
- type (dt) :: a
- integer :: i
- type foo
- integer :: i(5000)
- real :: j(5)
- type(dt) :: d
- end type foo
- type bar
- integer :: j(5000)
- real :: k(5)
- type(dt) :: d
- end type bar
- type (foo) :: oof
- type (bar) :: rab
- integer(8) :: size_500, size_200, sizev500, sizev200
- type all
- real, allocatable :: r(:)
- end type all
- real :: r(200), s(500)
- type(all) :: v
-
- if (sizeof(a) /= sizeof(i)) call abort
- if (sizeof(oof) /= sizeof(rab)) call abort
- allocate (v%r(500))
- sizev500 = sizeof (v)
- size_500 = sizeof (v%r)
- deallocate (v%r)
- allocate (v%r(200))
- sizev200 = sizeof (v)
- size_200 = sizeof (v%r)
- deallocate (v%r)
- if (size_500 - size_200 /= sizeof(s) - sizeof(r) .or. sizev500 /= sizev200) &
- call abort
-end subroutine check_derived
-
-call check_int (1)
-call check_real (1.0, (/1.0, 2.0, 3.0, 4.0, 5.0/))
-call check_derived ()
-end