OpenCores
URL https://opencores.org/ocsvn/openrisc_2011-10-31/openrisc_2011-10-31/trunk

Subversion Repositories openrisc_2011-10-31

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [array_constructor_type_15.f03] - Blame information for rev 384

Details | Compare with Previous | View Log

Line No. Rev Author Line
1 302 jeremybenn
! { dg-do compile }
2
! PR fortran/27997
3
!
4
! Array constructor with typespec
5
! for derived types, failing conversion.
6
 
7
PROGRAM test
8
  IMPLICIT NONE
9
 
10
  TYPE foo
11
    INTEGER :: i
12
    REAL :: x
13
  END TYPE foo
14
 
15
  TYPE bar
16
    LOGICAL :: logos
17
  END TYPE bar
18
 
19
  TYPE(foo), PARAMETER :: x = foo(42, 42.)
20
 
21
  WRITE (*,*) (/ TYPE(foo) :: x, foo(0, 1.), bar(.TRUE.) /) ! { dg-error "convert TYPE" }
22
END PROGRAM test

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.