public inbox for gcc-bugs@sourceware.org
help / color / mirror / Atom feed
* [Bug fortran/43199]  New: Internal error using fortran-2003 .mod file
@ 2010-02-27 13:23 fmartinez at gmv dot com
  2010-02-27 17:15 ` [Bug fortran/43199] " kargl at gcc dot gnu dot org
                   ` (6 more replies)
  0 siblings, 7 replies; 8+ messages in thread
From: fmartinez at gmv dot com @ 2010-02-27 13:23 UTC (permalink / raw)
  To: gcc-bugs

The generated m_string.mod from m_string.f03 generated with latest version of
gcc-fortran 4.5 generates an internal error when used in any other fortran
module through a use statement.

_____________________________________________________________________________

module m_string

!-------------------------------------------------------------------------------
! Copyright : Fran Martinez Fadrique
! Project   : FORTRAN
! Author    : Fran Martinez Fadrique
! Language  : Fortran 95
! Synopsis  : Dynamic character string
!-------------------------------------------------------------------------------

!---USE
statements--------------------------------------------------------------


!---End of use
statements-------------------------------------------------------

  implicit none

!---Public/Private
declarations-------------------------------------------------

  private
  public t_string

  public string, string_

!---End of public/private
declarations------------------------------------------

  character(len=130), parameter, private :: sccs_info = &
    '$Id: $'

!---Declaration of module
variables---------------------------------------------


! Time type
  type t_string

    private
      character, dimension(:), allocatable :: string      ! String buffer
      integer                              :: length = 0  ! String length
      integer                              :: size   = 0  ! Total buffer size

    contains

      generic :: index => string_index_s, string_index_c
      procedure, private :: string_index_s
      procedure, private :: string_index_c

      generic :: operator(+) => string_concat_string, &
                                string_concat_char
      generic :: operator(//) => string_concat_string, &
                                 string_concat_char
      procedure, private :: string_concat_string
      procedure, private :: string_concat_char

      generic :: operator(==) => string_equal_string, &
                                 string_equal_char
      procedure, private :: string_equal_string
      procedure, private :: string_equal_char

      generic :: operator(/=) => string_nonequal_string, &
                                 string_nonequal_char
      procedure, private :: string_nonequal_string
      procedure, private :: string_nonequal_char

      generic :: operator(>) => string_greater_string, &
                                string_greater_char
      generic :: lgt => string_greater_string, &
                        string_greater_char
      procedure, private :: string_greater_string
      procedure, private :: string_greater_char

      generic :: operator(<) => string_less_string, &
                                string_less_char
      generic :: llt => string_less_string, &
                        string_less_char
      procedure, private :: string_less_string
      procedure, private :: string_less_char

      generic :: operator(>=) => string_greater_equal_string, &
                                 string_greater_equal_char
      generic :: lge => string_greater_equal_string, &
                        string_greater_equal_char
      procedure, private :: string_greater_equal_string
      procedure, private :: string_greater_equal_char

      generic :: operator(<=) => string_less_equal_string, &
                                 string_less_equal_char
      generic :: lle => string_less_equal_string, &
                        string_less_equal_char
      procedure, private :: string_less_equal_string
      procedure, private :: string_less_equal_char

      procedure :: len => string_len
      procedure :: len_trim => string_len_trim
      procedure :: trim => string_trim
      procedure :: len_strip => string_len_strip
      procedure :: strip => string_strip
      procedure :: adjustl => string_adjustl
      procedure :: adjustr => string_adjustr
      procedure :: char => string_to_char
      procedure :: write => string_write
      procedure :: write_xml => string_write_xml
      procedure :: read => string_read

  end type t_string

! The blank character
  character, parameter :: blank = ' '

! Element assignement operator
  interface assignment(=)
    module procedure string_assign_from_char
    module procedure char_assign_from_string
  end interface

! Concatenation operations
  interface operator(+)
    module procedure char_concat_string
    module procedure char_concat_char
  end interface
  interface operator(//)
    module procedure char_concat_string
  end interface

! Element comparison operators lead by character instead of string
  interface operator(==)
    module procedure char_equal_string
  end interface
  interface operator(/=)
    module procedure char_nonequal_string
  end interface
  interface operator(>)
    module procedure char_greater_string
  end interface
  interface operator(>=)
    module procedure char_greater_equal_string
  end interface
  interface operator(<)
    module procedure char_less_string
  end interface
  interface operator(<=)
    module procedure char_less_equal_string
  end interface

! Aliases to make the type compatible with intrinsic character
! Read/write interafaces
  interface read
    module procedure string_read
  end interface read
  interface write
    module procedure string_write
  end interface write
  interface write_xml
    module procedure string_write_xml
  end interface write_xml

!---End of declaration of module
variables--------------------------------------

contains


! Constructor
elemental function string( c ) result(s)

! The character string to use as initialisation (optional)
  character(len=*), optional, intent(in)  :: c

! The string
  type(t_string) :: s


! Check input character string
  if( present(c) ) then

!   Initialise from input
    s = c

  else

!   Initialisation by default

  end if

end function string


! Destructor
elemental subroutine string_( s )

! The string
  type(t_string), intent(inout) :: s

! Deallocate memory
  if( allocated(s%string) ) then
    deallocate(s%string)
  end if
  s%size   = 0
  s%length = 0

end subroutine string_


! String length
elemental function string_len ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The string length
  integer                    :: res

! Return the length
  res = s%length

end function string_len


! String length (traling blanks removed)
elemental function string_len_trim ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The string length
  integer                    :: res

! Check lenth
  if( s%length == 0 ) then
    res = 0
  else
    do res = s%length, 1, -1
      if( s%string(res) /= blank ) exit
    end do
  end if

end function string_len_trim


! String length (traling leading and blanks removed)
elemental function string_len_strip ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The string length
  integer                    :: res

! Compute length
  res = len_trim(adjustl(s%char()))

end function string_len_strip


! Remove string traling blanks
elemental function string_trim ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The resulting character string
  type(t_string)             :: res

! Allocate return string
  res%length = s%len_trim()
  res%size   = res%length
  allocate( res%string(res%length) )

! Compute the trimmed string
  res%string(:res%length) = s%string(:res%length)

end function string_trim


! Remove string leading and traling blanks
elemental function string_strip ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The resulting character string
  type(t_string)             :: res


! Allocate return string
  res%length = len_trim(adjustl(s%char()))
  res%size   = res%length
  allocate( res%string(res%length) )

! Compute the stripped string
  res%string(:res%length) = transfer( adjustl(s%char()), s%string )

end function string_strip


! Left justify string contents
elemental function string_adjustl ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The resulting character string
  type(t_string)             :: res

! Compute the left justified string
  res = adjustl(s%char())

end function string_adjustl


! Right justify string contents
elemental function string_adjustr ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The resulting character string
  type(t_string)             :: res

! Compute the right justified string
  res = adjustr(s%char())

end function string_adjustr


! Get the position of a substring in a string
elemental function string_index_s( s, subs, back ) result(res)

! The string
  class(t_string), intent(in) :: s

! The string searched
  type(t_string), intent(in) :: subs

! The search direction
  logical, optional,    intent(in) :: back

! The character position
  integer                          :: res

! Compute the position
  res = index( s%char(), subs%char(), back)

end function string_index_s


! Get the position of a substring in a string
elemental function string_index_c( s, subs, back ) result(res)

! The string
  class(t_string),       intent(in) :: s

! The string searched
  character(len=*),     intent(in) :: subs

! The search direction
  logical, optional,    intent(in) :: back

! The character position
  integer                          :: res

! Compute the position
  res = index(s%char(),subs,back)

end function string_index_c


! Return the string as character
pure function string_to_char ( s ) result(res)

! The string
  class(t_string), intent(in) :: s

! The resulting character string
  character(len=size(s%string)) :: res

! Return the character string
  res = transfer( s%string, res )

end function string_to_char


! Read a string from an open unit
subroutine string_read( s, unit, iostat, format )

! The string
  class(t_string),             intent(out) :: s

! The open file to read from
  integer,                    intent(in)  :: unit

! The read condition status
  integer, optional,          intent(out) :: iostat

! The read format (optional)
  character(len=*), optional, intent(in)  :: format

! Local storage
  character(len=1024) :: local
  integer :: lsize

! Check format
  if( present(format) ) then
    read(unit,format,iostat=iostat) local
    lsize = len(local)
  else
    read(unit,'(A1024)',iostat=iostat) local
    lsize = len_trim(local)
  end if

! Generate output string
  allocate( s%string(lsize) )
  s%string = transfer( local, s%string )

end subroutine string_read


! Write in XML
subroutine string_write_xml( s, unit, label )

! The string
  class(t_string),   intent(in) :: s

! The open file to write the element to
  integer,          intent(in) :: unit

! Envelope XML tag
  character(len=*), intent(in) :: label

! Write the vector envelope start tag
  write(unit,'(A)',advance='no') '<' // label // '>'

! Write the string
  call string_write( s, unit, advance='no' )

! Write the vector envelope end tag
  write(unit,'(A)') '</' // label // '>'

end subroutine string_write_xml


! Write in ASCII
subroutine string_write( s, unit, advance )

! The vector
  class(t_string),             intent(in) :: s

! The open file to write the element to
  integer,                    intent(in) :: unit

! Write a new line after the vector (true by default)
  character(len=*), optional, intent(in) :: advance


! Write the string
  write( unit, '(A)', advance='no' ) s%char()

! Check for newline at the end
  if( present(advance) ) then
    if( advance == 'YES' ) then
      write(unit,*)
    end if
  else
    write(6,*)
  end if

end subroutine string_write


! Assign operator (string from char)
elemental subroutine string_assign_from_char( left, right )

! The target string
  type(t_string),   intent(out) :: left

! The source string
  character(len=*), intent(in)  :: right

! Assign memory
  allocate(left%string(len(right)))
  left%string = blank

! Copy memory
  left%string = transfer( right, left%string )

! Copy structure information
  left%size   = len(right)
  left%length = len(right)

end subroutine string_assign_from_char


! Assign operator (char from string)
pure subroutine char_assign_from_string( left, right )

! The target string
  character(len=*), intent(out) :: left

! The source string
  type(t_string),                    intent(in)  :: right

! Copy memory
  left = ' '
  left(:right%length) = transfer( right%string(:right%length), left )

end subroutine char_assign_from_string


! Concatenation operations
elemental function string_concat_string( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  type(t_string), intent(in) :: right

! The resulting string
  type(t_string) :: res

! Size of the resulting string
  integer :: size_l, size_r

! Check buffer sizes (minimise buffer grouth)
  size_l = left%len_trim()
  size_r = right%len_trim()

! Allocate resulting string
  allocate( res%string(size_l+size_r) )

! Compute the resulting string
  res%string(1:size_l)             = left%string
  res%string(size_l+1:size_l+size_r) = right%string
  res%length = size_l + size_r
  res%size = res%length

end function string_concat_string


! Concatenation operations
elemental function string_concat_char( left, right ) result(res)

! The left string
  class(t_string),   intent(in) :: left

! The right string
  character(len=*), intent(in) :: right

! The resulting string
  type(t_string) :: res

! Size of the resulting string
  integer :: size_l, size_r

! Check buffer sizes (minimise buffer grouth)
  size_l = left%len_trim()
  size_r = len(right)

! Allocate resulting string
  allocate( res%string(size_l+size_r) )

! Compute the resulting string
  res%string(1:size_l)             = left%string
  res%string(size_l+1:size_l+size_r) = transfer( right, res%string(1:size_r) )
  res%length = size_l + size_r
  res%size = res%length

end function string_concat_char


! Concatenation operations
elemental function char_concat_string( left, right ) result(res)

! The left string
  character(len=*), intent(in) :: left

! The right string
  type(t_string),   intent(in) :: right

! The resulting string
  type(t_string) :: res

! Size of the resulting string
  integer :: size_l, size_r

! Check buffer sizes (minimise buffer grouth)
  size_l = len(left)
  size_r = right%len_trim()

! Allocate resulting string
  allocate( res%string(size_l+size_r) )

! Compute the resulting string
  res%string(1:size_l)             = transfer( left, res%string(1:size_l) )
  res%string(size_l+1:size_l+size_r) = right%string(1:size_r)
  res%length = size_l + size_r
  res%size = res%length

end function char_concat_string


! Concatenation operations
elemental function char_concat_char( left, right ) result(res)

! The left string
  character(len=*),     intent(in) :: left

! The right string
  character(len=*),     intent(in) :: right

! The resulting string
  type(t_string) :: res

! Size of the resulting string
  integer :: size_l, size_r

! Check buffer sizes (minimise buffer grouth)
  size_l = len(left)
  size_r = len(right)

! Allocate resulting string
  allocate( res%string(size_l+size_r) )

! Compute the resulting string
  res%string(1:size_l)               = transfer( left, res%string(1:size_l) )
  res%string(size_l+1:size_l+size_r) = transfer( right, res%string(1:size_r) )
  res%length = size_l + size_r
  res%size = res%length

end function char_concat_char


! Equality comparison operator (string == string)
elemental function string_equal_string( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  type(t_string), intent(in) :: right

! The comparison result
  logical                    :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = right%len_trim()

! Compute equality
  if( size_l == size_r ) then
    res = all( left%string(1:size_l) == right%string(1:size_r) )
  else
    res = .false.
  end if

end function string_equal_string


! Equality comparison operator (string == character)
elemental function string_equal_char( left, right ) result(res)

! The left string
  class(t_string),   intent(in) :: left

! The right string
  character(len=*), intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = len_trim(right)

! Compute equality
  if( size_l == size_r ) then
    res = all( left%string(1:size_l) == right(1:size_r) )
  else
    res = .false.
  end if

end function string_equal_char


! Equality comparison operator (character == string)
elemental function char_equal_string( left, right ) result(res)

! The left string
  character(len=*), intent(in) :: left

! The right string
  type(t_string),   intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = len_trim(left)
  size_r = right%len_trim()

! Compute equality
  if( size_l == size_r ) then
    res = left(1:size_l) == transfer( right%string(1:size_r), left )
  else
    res = .false.
  end if

end function char_equal_string


! Inequality comparison operator (string /= string)
elemental function string_nonequal_string( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  type(t_string), intent(in) :: right

! The comparison result
  logical                    :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = right%len_trim()

! Compute equality
  if( size_l == size_r ) then
    res = any( left%string(1:size_l) /= right%string(1:size_r) )
  else
    res = .true.
  end if

end function string_nonequal_string


! Inequality comparison operator (string /= character)
elemental function string_nonequal_char( left, right ) result(res)

! The left string
  class(t_string),   intent(in) :: left

! The right string
  character(len=*), intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = len_trim(right)

! Compute equality
  if( size_l == size_r ) then
    res = any( left%string(1:size_l) /= right(1:size_r) )
  else
    res = .true.
  end if

end function string_nonequal_char


! Inequality comparison operator (character /= string)
elemental function char_nonequal_string( left, right ) result(res)

! The left string
  character(len=*), intent(in) :: left

! The right string
  type(t_string),   intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = len_trim(left)
  size_r = right%len_trim()

! Compute equality
  if( size_l == size_r ) then
    res = any( left(1:size_l) /= right%string(1:size_r) )
  else
    res = .true.
  end if

end function char_nonequal_string


! Comparison operator 'string > string'  
elemental function string_greater_string( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  type(t_string), intent(in) :: right

! The comparison result
  logical                    :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = right%len_trim()

! Compute comparison
  res = lgt( transfer( left%string,  repeat(' ',size_l) ),   &
             transfer( right%string, repeat(' ',size_r) ) )

end function string_greater_string


! Comparison operator 'string > character'  
elemental function string_greater_char( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  character(len=*),     intent(in) :: right

! The comparison result
  logical                          :: res

! String lengths (traling blanks removed)
  integer size_l

! Compute lengths
  size_l = left%len_trim()

! Compute comparison
  res = lgt( transfer( left%string,  repeat(' ',size_l) ), right )

end function string_greater_char


! Comparison operator 'character > string'
elemental function char_greater_string( left, right ) result(res)

! The left string
  character(len=*), intent(in) :: left

! The right string
  type(t_string),   intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_r

! Compute lengths
  size_r = right%len_trim()

! Compute comparison
  res = lgt( left, transfer( right%string,  repeat(' ',size_r) ) )

end function char_greater_string


! Comparison operator 'string >= string'
elemental function string_greater_equal_string( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  type(t_string), intent(in) :: right

! The comparison result
  logical                    :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = right%len_trim()

! Compute comparison
  res = lge( transfer( left%string,  repeat(' ',size_l) ),   &
             transfer( right%string, repeat(' ',size_r) ) )

end function string_greater_equal_string


! Comparison operator 'string >= character'  
elemental function string_greater_equal_char( left, right ) result(res)

! The left string
  class(t_string),   intent(in) :: left

! The right string
  character(len=*), intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_l

! Compute lengths
  size_l = left%len_trim()

! Compute comparison
  res = lge( transfer( left%string,  repeat(' ',size_l) ), right )

end function string_greater_equal_char


! Comparison operator 'character >= string'
elemental function char_greater_equal_string( left, right ) result(res)

! The left string
  character(len=*), intent(in) :: left

! The right string
  type(t_string),   intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_r

! Compute lengths
  size_r = right%len_trim()

! Compute comparison
  res = lge( left, transfer( right%string,  repeat(' ',size_r) ) )

end function char_greater_equal_string


! Comparison operator 'string < string'
elemental function string_less_string( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  type(t_string), intent(in) :: right

! The comparison result
  logical                    :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = right%len_trim()

! Compute comparison
  res = llt( transfer( left%string,  repeat(' ',size_l) ),   &
             transfer( right%string, repeat(' ',size_r) ) )

end function string_less_string


! Comparison operator 'string < character'  
elemental function string_less_char( left, right ) result(res)

! The left string
  class(t_string),   intent(in) :: left

! The right string
  character(len=*), intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_l

! Compute lengths
  size_l = left%len_trim()

! Compute comparison
  res = llt( transfer( left%string,  repeat(' ',size_l) ), right )

end function string_less_char


! Comparison operator 'character < string'
elemental function char_less_string( left, right ) result(res)

! The left string
  character(len=*), intent(in) :: left

! The right string
  type(t_string),   intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_r

! Compute lengths
  size_r = right%len_trim()

! Compute comparison
  res = llt( left, transfer( right%string,  repeat(' ',size_r) ) )

end function char_less_string


! Comparison operator 'string <= string'
elemental function string_less_equal_string( left, right ) result(res)

! The left string
  class(t_string), intent(in) :: left

! The right string
  type(t_string), intent(in) :: right

! The comparison result
  logical                    :: res

! String lengths (traling blanks removed)
  integer size_l, size_r

! Compute lengths
  size_l = left%len_trim()
  size_r = right%len_trim()

! Compute comparison
  res = lle( transfer( left%string,  repeat(' ',size_l) ),   &
             transfer( right%string, repeat(' ',size_r) ) )

end function string_less_equal_string


! Comparison operator 'string <= character'  
elemental function string_less_equal_char( left, right ) result(res)

! The left string
  class(t_string),   intent(in) :: left

! The right string
  character(len=*), intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_l

! Compute lengths
  size_l = left%len_trim()

! Compute comparison
  res = lle( transfer( left%string,  repeat(' ',size_l) ), right )

end function string_less_equal_char


! Comparison operator 'character <= string'
elemental function char_less_equal_string( left, right ) result(res)

! The left string
  character(len=*), intent(in) :: left

! The right string
  type(t_string),   intent(in) :: right

! The comparison result
  logical                      :: res

! String lengths (traling blanks removed)
  integer size_r

! Compute lengths
  size_r = right%len_trim()

! Compute comparison
  res = lle( left, transfer( right%string,  repeat(' ',size_r) ) )

end function char_less_equal_string

end module m_string


-- 
           Summary: Internal error using fortran-2003 .mod file
           Product: gcc
           Version: 4.5.0
            Status: UNCONFIRMED
          Severity: blocker
          Priority: P3
         Component: fortran
        AssignedTo: unassigned at gcc dot gnu dot org
        ReportedBy: fmartinez at gmv dot com


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

* [Bug fortran/43199] Internal error using fortran-2003 .mod file
  2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
@ 2010-02-27 17:15 ` kargl at gcc dot gnu dot org
  2010-02-27 17:48 ` [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found burnus at gcc dot gnu dot org
                   ` (5 subsequent siblings)
  6 siblings, 0 replies; 8+ messages in thread
From: kargl at gcc dot gnu dot org @ 2010-02-27 17:15 UTC (permalink / raw)
  To: gcc-bugs



------- Comment #1 from kargl at gcc dot gnu dot org  2010-02-27 17:15 -------
I changed the severity level to 'normal'.  A Fortran issue is
never considered to be bocker.

Can you attach the files to the bug report?  Copy and paste
from a web browse is fraught with problems; in particular,
whitespace and long lines.


-- 

kargl at gcc dot gnu dot org changed:

           What    |Removed                     |Added
----------------------------------------------------------------------------
           Severity|blocker                     |normal


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

* [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found
  2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
  2010-02-27 17:15 ` [Bug fortran/43199] " kargl at gcc dot gnu dot org
@ 2010-02-27 17:48 ` burnus at gcc dot gnu dot org
  2010-02-27 18:43 ` burnus at gcc dot gnu dot org
                   ` (4 subsequent siblings)
  6 siblings, 0 replies; 8+ messages in thread
From: burnus at gcc dot gnu dot org @ 2010-02-27 17:48 UTC (permalink / raw)
  To: gcc-bugs



------- Comment #2 from burnus at gcc dot gnu dot org  2010-02-27 17:47 -------
Thanks for the report.

(In reply to comment #1)
> I changed the severity level to 'normal'.  A Fortran issue is
> never considered to be bocker.

Especially not if it involves a new experimental feature such as polymorphic
data types.

> Can you attach the files to the bug report?  Copy and paste
> from a web browse is fraught with problems; in particular,
> whitespace and long lines.

I think it was not that bad - only three or so overlong lines (comment lines);
however, an attachment make the bug more readable.

Reduced test case; compiles with NAG f95 v5.1 and ifort 11.1. gfortran fails
with:

end
   1
Internal Error at (1):
find_array_spec(): Component not found



module m_string
  type t_string
      character, dimension(:), allocatable :: string
  end type t_string
contains
pure function string_to_char ( s ) result(res)
  class(t_string), intent(in) :: s
  character(len=size(s%string)) :: res
  res = ''
end function string_to_char
end module m_string
use m_string
end


-- 

burnus at gcc dot gnu dot org changed:

           What    |Removed                     |Added
----------------------------------------------------------------------------
           Severity|normal                      |blocker
             Status|UNCONFIRMED                 |NEW
     Ever Confirmed|0                           |1
           Keywords|                            |ice-on-valid-code
   Last reconfirmed|0000-00-00 00:00:00         |2010-02-27 17:47:54
               date|                            |
            Summary|Internal error using        |[OOP] ICE when reading
                   |fortran-2003 .mod file      |module file:
                   |                            |find_array_spec(): Component
                   |                            |not found


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

* [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found
  2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
  2010-02-27 17:15 ` [Bug fortran/43199] " kargl at gcc dot gnu dot org
  2010-02-27 17:48 ` [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found burnus at gcc dot gnu dot org
@ 2010-02-27 18:43 ` burnus at gcc dot gnu dot org
  2010-02-27 19:38 ` burnus at gcc dot gnu dot org
                   ` (3 subsequent siblings)
  6 siblings, 0 replies; 8+ messages in thread
From: burnus at gcc dot gnu dot org @ 2010-02-27 18:43 UTC (permalink / raw)
  To: gcc-bugs



-- 

burnus at gcc dot gnu dot org changed:

           What    |Removed                     |Added
----------------------------------------------------------------------------
           Severity|blocker                     |normal


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

* [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found
  2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
                   ` (2 preceding siblings ...)
  2010-02-27 18:43 ` burnus at gcc dot gnu dot org
@ 2010-02-27 19:38 ` burnus at gcc dot gnu dot org
  2010-02-27 23:27 ` fmartinez at gmv dot com
                   ` (2 subsequent siblings)
  6 siblings, 0 replies; 8+ messages in thread
From: burnus at gcc dot gnu dot org @ 2010-02-27 19:38 UTC (permalink / raw)
  To: gcc-bugs



------- Comment #3 from burnus at gcc dot gnu dot org  2010-02-27 19:37 -------
Janus, can you have a look? I was wondering whether the following patch makes
sense.  If you have time, can you finish a patch for this PR and PR 43169.

Index: resolve.c
===================================================================
--- resolve.c   (Revision 157111)
+++ resolve.c   (Arbeitskopie)
@@ -4006,6 +4006,8 @@ find_array_spec (gfc_expr *e)
       case REF_COMPONENT:
        if (derived == NULL)
          derived = e->symtree->n.sym->ts.u.derived;
+        if (derived->attr.is_class)
+          derived = derived->components->ts.u.derived;

        c = derived->components;


-- 

burnus at gcc dot gnu dot org changed:

           What    |Removed                     |Added
----------------------------------------------------------------------------
                 CC|                            |janus at gcc dot gnu dot org


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

* [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found
  2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
                   ` (3 preceding siblings ...)
  2010-02-27 19:38 ` burnus at gcc dot gnu dot org
@ 2010-02-27 23:27 ` fmartinez at gmv dot com
  2010-03-01  9:24 ` burnus at gcc dot gnu dot org
  2010-03-01  9:25 ` burnus at gcc dot gnu dot org
  6 siblings, 0 replies; 8+ messages in thread
From: fmartinez at gmv dot com @ 2010-02-27 23:27 UTC (permalink / raw)
  To: gcc-bugs



------- Comment #4 from fmartinez at gmv dot com  2010-02-27 23:27 -------
Created an attachment (id=19984)
 --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=19984&action=view)
Fortran source code

File whose generated .mod file causes the compiler error


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

* [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found
  2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
                   ` (4 preceding siblings ...)
  2010-02-27 23:27 ` fmartinez at gmv dot com
@ 2010-03-01  9:24 ` burnus at gcc dot gnu dot org
  2010-03-01  9:25 ` burnus at gcc dot gnu dot org
  6 siblings, 0 replies; 8+ messages in thread
From: burnus at gcc dot gnu dot org @ 2010-03-01  9:24 UTC (permalink / raw)
  To: gcc-bugs



------- Comment #5 from burnus at gcc dot gnu dot org  2010-03-01 09:24 -------
Subject: Bug 43199

Author: burnus
Date: Mon Mar  1 09:23:35 2010
New Revision: 157133

URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=157133
Log:
2010-03-01  Tobias Burnus  <burnus@net-b.de>

        PR fortran/43199
        * resolve.c (find_array_spec): Handle REF_COMPONENT with
        CLASS components.

2010-03-01  Tobias Burnus  <burnus@net-b.de>

        PR fortran/43199
        * gfortran.dg/module_read_2.f90: New test.


Added:
    trunk/gcc/testsuite/gfortran.dg/module_read_2.f90
Modified:
    trunk/gcc/fortran/ChangeLog
    trunk/gcc/fortran/resolve.c
    trunk/gcc/testsuite/ChangeLog


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

* [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found
  2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
                   ` (5 preceding siblings ...)
  2010-03-01  9:24 ` burnus at gcc dot gnu dot org
@ 2010-03-01  9:25 ` burnus at gcc dot gnu dot org
  6 siblings, 0 replies; 8+ messages in thread
From: burnus at gcc dot gnu dot org @ 2010-03-01  9:25 UTC (permalink / raw)
  To: gcc-bugs



------- Comment #6 from burnus at gcc dot gnu dot org  2010-03-01 09:24 -------
FIXED on the trunk (4.5). Thanks for the bugreport!


-- 

burnus at gcc dot gnu dot org changed:

           What    |Removed                     |Added
----------------------------------------------------------------------------
             Status|NEW                         |RESOLVED
         Resolution|                            |FIXED


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43199


^ permalink raw reply	[flat|nested] 8+ messages in thread

end of thread, other threads:[~2010-03-01  9:25 UTC | newest]

Thread overview: 8+ messages (download: mbox.gz / follow: Atom feed)
-- links below jump to the message on this page --
2010-02-27 13:23 [Bug fortran/43199] New: Internal error using fortran-2003 .mod file fmartinez at gmv dot com
2010-02-27 17:15 ` [Bug fortran/43199] " kargl at gcc dot gnu dot org
2010-02-27 17:48 ` [Bug fortran/43199] [OOP] ICE when reading module file: find_array_spec(): Component not found burnus at gcc dot gnu dot org
2010-02-27 18:43 ` burnus at gcc dot gnu dot org
2010-02-27 19:38 ` burnus at gcc dot gnu dot org
2010-02-27 23:27 ` fmartinez at gmv dot com
2010-03-01  9:24 ` burnus at gcc dot gnu dot org
2010-03-01  9:25 ` burnus at gcc dot gnu dot org

This is a public inbox, see mirroring instructions
for how to clone and mirror all data and code used for this inbox;
as well as URLs for read-only IMAP folder(s) and NNTP newsgroup(s).