aboutsummaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/PR97046.f90
blob: 7d133a5ad70916d89bfd375f636698971ce1a980 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
! { dg-do run }
!
! Test the fix for PR94331
!
! Contributed by Igor Gayday <igor.gayday@mu.edu>
!

MODULE FOO

  implicit none
  
  INTEGER, parameter :: n = 11

contains
  
  SUBROUTINE dummyc(x0) BIND(C)
    type(*), dimension(..) :: x0
    if(LBOUND(x0,1)/=1) stop 5
    if(UBOUND(x0,1)/=n) stop 6
    if(rank(x0)/=1)     stop 7
  END SUBROUTINE dummyc
  
  SUBROUTINE dummy(x0)
    type(*), dimension(..) :: x0
    call dummyc(x0)
  END SUBROUTINE dummy
  
END MODULE

PROGRAM main
    USE FOO
    IMPLICIT NONE
    integer :: before(2), after(2)

    DOUBLE PRECISION, ALLOCATABLE :: buf(:)
    DOUBLE PRECISION :: buf2(n)

    ALLOCATE(buf(n))
    before(1) = LBOUND(buf,1)
    before(2) = UBOUND(buf,1)
    CALL dummy (buf)
    after(1) = LBOUND(buf,1)
    after(2) = UBOUND(buf,1)
    deallocate(buf)

    if (before(1) .NE. after(1)) stop 1
    if (before(2) .NE. after(2)) stop 2

    before(1) = LBOUND(buf2,1)
    before(2) = UBOUND(buf2,1)
    CALL dummy (buf2)
    after(1) = LBOUND(buf2,1)
    after(2) = UBOUND(buf2,1)

    if (before(1) .NE. after(1)) stop 3
    if (before(2) .NE. after(2)) stop 4

END PROGRAM