f18-llvm-project
f18-llvm-project copied to clipboard
Fork of llvm/llvm-project for f18. In sync with f18-mlir and f18.
Failure with this test: nag_f95_syntax/909t918.f90 error: Must have INTEGER type, but is REAL(4) Per PKlausler: Error is legitimate due to the use of a real-valued I/O implied DO loop control...
We do not currently handle the case where an internal procedure calls a procedure whose name is declared in an outer scope. Here's an example program: ``` PROGRAM call_outer INTRINSIC...
I've noticed the vla expression is evaluated every time it is mentioned in the code: ```fortran SUBROUTINE S(N) IMPLICIT NONE INTEGER :: UB1 INTEGER :: UB2 INTEGER :: N INTEGER...
We are making unnecessary copies of arguments to intrinsic calls when the arguments are arrays. This was first exposed with calls to dot product, but there are probably others. program...
``` type t integer :: i end type type(t) :: scalar, array(10) array = scalar end ``` Crashes bbc with error: 'fir.convert' op invalid type conversion With `--dump-module-on-failure` (full dump...
``` subroutine foo() implicit none integer :: stepx contains subroutine bar() integer :: edgex, i edgex(i) = i + stepx print *, edgex(10) end subroutine end subroutine ``` `stepx` is...
``` program srk use,intrinsic :: ieee_exceptions integer,parameter :: k = selected_real_kind(15) real (k) :: r logical :: l l = ieee_support_flag(ieee_divide_by_zero,r) end program ``` ``` flang -c srk.f90 |& head...
`bbc` crashed. ```fortran module broyden_func_interface abstract interface function broyden_func(x) real(8), dimension(:), intent(in) :: x real(8), dimension(size(x)) :: broyden_func end function end interface end module subroutine fdjac(x,df) use broyden_func_interface implicit none...
``` /mis/itmprt.f:112:21: error: Format expression must be default character or integer & WRITE (OTPE,CORE) (ICORE(I),I=NS,NP) ``` `gfortran` gives ``` ./mis/itmprt.f:112.20: & WRITE (OTPE,CORE) (ICORE(I),I=NS,NP) 1 Warning: Legacy Extension: Non-character in...
``` ./mis/ofp.f:1035:16: error: Assigned format label must be a scalar variable 1950 WRITE (L,FMT) IHARM,(REAL(I),FREAL(I+1),I=1,K2,2) ``` `gfortran` spits out warning ``` ./mis/ofp.f:1035.15: 1950 WRITE (L,FMT) IHARM,(REAL(I),FREAL(I+1),I=1,K2,2) 1 Warning: Legacy Extension:...