aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/type_decl_1.f90
blob: badb9aeaefe6352dd0f525e86952588d145ee60c (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
! { dg-do compile }
! { dg-options "-std=f2008" }
!
! Fortran 2008: TYPE ( intrinsic-type-spec )
!
implicit none
type(integer) :: a
type(real) :: b
type(logical ) :: c
type(character) :: d
type(double precision) :: e

type(integer(8)) :: f
type(real(kind=4)) :: g
type(logical ( kind = 1 ) ) :: h
type(character (len=10,kind=1) ) :: i

type(double complex) :: j ! { dg-error "Extension: DOUBLE COMPLEX" }
end

module m
  integer, parameter :: k4  = 4
end module m

type(integer (kind=k4)) function f()
  use m
  f = 42
end