aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/initialization_14.f90
blob: 4d5b6856cf015b306fe24be28dd7297bbc5206a3 (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
! { dg-do compile }
! PR 20851
! Dummy arguments are disallowed in initialization expressions in
! elemental functions except as arguments to the intrinsic functions
! BIT_SIZE, KIND, LEN, or to the numeric inquiry functions listed
! in 13.11.8
MODULE TT
INTEGER M
CONTAINS
   ELEMENTAL REAL FUNCTION two(N)
     INTEGER, INTENT(IN) :: N
     INTEGER, DIMENSION(N) :: scr ! { dg-error "Dummy argument 'n' not allowed in expression" }
   END FUNCTION

   ELEMENTAL REAL FUNCTION twopointfive(N)
     INTEGER, INTENT(IN) :: N
     INTEGER, DIMENSION(MAX(N,2)) :: scr ! { dg-error "Dummy argument 'n' not allowed in expression" }
   end FUNCTION twopointfive

   REAL FUNCTION three(N)
     INTEGER, INTENT(IN) :: N
     INTEGER, DIMENSION(N) :: scr ! this time it's valid
   END FUNCTION

   ELEMENTAL REAL FUNCTION four(N)
     INTEGER, INTENT(IN) :: N
     INTEGER, DIMENSION(bit_size(N)) :: scr ! another valid variant
   END FUNCTION

   ELEMENTAL REAL FUNCTION gofourit(N)
     INTEGER, INTENT(IN) :: N
     INTEGER, DIMENSION(MIN(HUGE(N),1)) :: scr ! another valid variant
   END FUNCTION

   ELEMENTAL REAL FUNCTION fourplusone(N)
     INTEGER, INTENT(IN) :: N
     INTEGER, DIMENSION(M) :: scr ! another valid variant
   END FUNCTION

   ELEMENTAL REAL FUNCTION five(X)
     real, intent(in) :: x
     CHARACTER(LEN=PRECISION(X)) :: C ! valid again
   END FUNCTION
END MODULE
END