OpenCores
URL https://opencores.org/ocsvn/openrisc_me/openrisc_me/trunk

Subversion Repositories openrisc_me

[/] [openrisc/] [trunk/] [gnu-src/] [gcc-4.2.2/] [gcc/] [testsuite/] [gfortran.dg/] [implicit_9.f90] - Blame information for rev 199

Go to most recent revision | Details | Compare with Previous | View Log

Line No. Rev Author Line
1 149 jeremybenn
! { dg-do compile }
2
! Tests patch for PR29373, in which the implicit character
3
! statement messes up the function declaration because the
4
! requisite functions in decl.c were told nothing about
5
! implicit types.
6
!
7
! Contributed by Tobias Schlueter  
8
!
9
  implicit character*32 (a-z)
10
  CHARACTER(len=255), DIMENSION(1,2)  :: a
11
 
12
! Reporters original, which triggers another error:
13
! gfc_todo: Not Implemented: complex character array
14
! constructors.=> PR29431
15
!  a = reshape((/ to_string(1.0) /), (/ 1, 2 /))
16
 
17
  a = to_string(1.0)
18
  print *, a
19
  CONTAINS
20
    CHARACTER*(32) FUNCTION to_string(x)
21
      REAL, INTENT(in) :: x
22
      WRITE(to_string, FMT="(F6.3)") x
23
    END FUNCTION
24
END PROGRAM

powered by: WebSVN 2.1.0

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