Skip to content
Snippets Groups Projects
Commit 1b4a8aae authored by Tobias Burnus's avatar Tobias Burnus Committed by Tobias Burnus
Browse files

abstract_type_1.f90: Fix dg-do syntax.

2011-02-22  Tobias Burnus  <burnus@net-b.de>

        * abstract_type_1.f90: Fix dg-do syntax.
        * abstract_type_2.f03: Ditto.
        * abstract_type_3.f03: Ditto.
        * abstract_type_4.f03: Ditto.
        * abstract_type_5.f03: Ditto.
        * abstract_type_6.f03: Ditto.
        * alloc_comp_constraint_6.f90: Ditto.
        * alloc_comp_init_expr.f03: Ditto.
        * allocatable_scalar_11.f90: Ditto.
        * allocate_scalar_with_shape.f90: Ditto.
        * array_function_5.f90: Ditto.
        * asynchronous_3.f03: Ditto.
        * char_expr_1.f90: Ditto.
        * class_14.f03: Ditto.
        * data_array_6.f: Ditto.
        * data_invalid.f90: Ditto.
        * dot_product_1.f03: Ditto.
        * func_derived_5.f90: Ditto.
        * func_result_4.f90: Ditto.
        * implied_do_1.f90: Ditto.
        * initialization_25.f90: Ditto.
        * initialization_26.f90: Ditto.
        * interface_34.f90: Ditto.
        * iso_c_binding_init_expr.f03: Ditto.
        * keyword_symbol_1.f90: Ditto.
        * matmul_8.f03: Ditto.
        * merge_init_expr.f90: Ditto.
        * pack_assign_1.f90: Ditto.
        * pack_vector_1.f90: Ditto.
        * pointer_check_8.f90: Ditto.
        * product_init_expr.f03: Ditto.
        * reshape_order_5.f90: Ditto.
        * reshape_shape_1.f90: Ditto.
        * reshape_zerosize_2.f90: Ditto.
        * same_name_2.f90: Ditto.
        * selected_real_kind_1.f90: Ditto.
        * spread_init_expr.f03: Ditto.
        * stmt_func_1.f90: Ditto.
        * sum_init_expr.f03: Ditto.
        * transpose_3.f03: Ditto.
        * unpack_init_expr.f03: Ditto.
        * warn_conversion.f90: Ditto.
        * warn_conversion_2.f90: Ditto.
        * warn_intent_out_not_set.f90: Ditto.
        * warn_unused_dummy_argument_1.f90: Ditto.
        * warn_unused_dummy_argument_2.f90: Ditto.
        * whole_file_16.f90: Ditto.
        * whole_file_17.f90: Ditto.
        * whole_file_18.f90: Ditto.
        * whole_file_20.f03: Ditto.
        * whole_file_5.f90: Ditto.
        * whole_file_6.f90: Ditto.
        * write_invalid_format.f90: Ditto.
        * zero_sized_6.f90: Ditto.

From-SVN: r170393
parent 88ee1fc7
No related branches found
No related tags found
No related merge requests found
Showing
with 76 additions and 19 deletions
2011-02-22 Tobias Burnus <burnus@net-b.de>
* abstract_type_1.f90: Fix dg-do syntax.
* abstract_type_2.f03: Ditto.
* abstract_type_3.f03: Ditto.
* abstract_type_4.f03: Ditto.
* abstract_type_5.f03: Ditto.
* abstract_type_6.f03: Ditto.
* alloc_comp_constraint_6.f90: Ditto.
* alloc_comp_init_expr.f03: Ditto.
* allocatable_scalar_11.f90: Ditto.
* allocate_scalar_with_shape.f90: Ditto.
* array_function_5.f90: Ditto.
* asynchronous_3.f03: Ditto.
* char_expr_1.f90: Ditto.
* class_14.f03: Ditto.
* data_array_6.f: Ditto.
* data_invalid.f90: Ditto.
* dot_product_1.f03: Ditto.
* func_derived_5.f90: Ditto.
* func_result_4.f90: Ditto.
* implied_do_1.f90: Ditto.
* initialization_25.f90: Ditto.
* initialization_26.f90: Ditto.
* interface_34.f90: Ditto.
* iso_c_binding_init_expr.f03: Ditto.
* keyword_symbol_1.f90: Ditto.
* matmul_8.f03: Ditto.
* merge_init_expr.f90: Ditto.
* pack_assign_1.f90: Ditto.
* pack_vector_1.f90: Ditto.
* pointer_check_8.f90: Ditto.
* product_init_expr.f03: Ditto.
* reshape_order_5.f90: Ditto.
* reshape_shape_1.f90: Ditto.
* reshape_zerosize_2.f90: Ditto.
* same_name_2.f90: Ditto.
* selected_real_kind_1.f90: Ditto.
* spread_init_expr.f03: Ditto.
* stmt_func_1.f90: Ditto.
* sum_init_expr.f03: Ditto.
* transpose_3.f03: Ditto.
* unpack_init_expr.f03: Ditto.
* warn_conversion.f90: Ditto.
* warn_conversion_2.f90: Ditto.
* warn_intent_out_not_set.f90: Ditto.
* warn_unused_dummy_argument_1.f90: Ditto.
* warn_unused_dummy_argument_2.f90: Ditto.
* whole_file_16.f90: Ditto.
* whole_file_17.f90: Ditto.
* whole_file_18.f90: Ditto.
* whole_file_20.f03: Ditto.
* whole_file_5.f90: Ditto.
* whole_file_6.f90: Ditto.
* write_invalid_format.f90: Ditto.
* zero_sized_6.f90: Ditto.
2011-02-21 Jeff Law <law@redhat.com>
PR rtl-optimization/46178
......
! { dg-do "compile" }
! { dg-do compile }
! { dg-options "-std=f95" }
! Abstract Types.
......
! { dg-do "compile" }
! { dg-do compile }
! Abstract Types.
! Check for parser errors.
......
! { dg-do "compile" }
! { dg-do compile }
! Abstract Types.
! Check for errors when using abstract types in an inappropriate way.
......
! { dg-do "compile" }
! { dg-do compile }
! Abstract Types.
! Check for module file IO.
......
! { dg-do "compile" }
! { dg-do compile }
! Abstract Types.
! Check for correct handling of abstract-typed base object references.
......
! { dg-do "compile" }
! { dg-do compile }
! Test the fix for PR43266, in which an ICE followed correct error messages.
!
! Contributed by Tobias Burnus <burnus@gcc.gnu.org>
......
! { dg-do compile )
! { dg-do compile }
! PR45889 Regression with I/O of element of allocatable array in derived type
module cell
implicit none
......
! { dg-do "compile" }
! { dg-do compile }
! PR fortran/34402 - allocatable components shall not be
! data-initialized in init expr
......
! { dg-compile }
! { dg-do compile }
!
! PR fortran/46484
!
......
! { dg-do "compile" }
! { dg-do compile }
! PR fortran/41940
integer, allocatable :: a
......
! { dg-do run )
! { dg-do run }
! PR41278 internal compiler error related to matmul and transpose
! Test case prepared by Jerry DeLisle <jvdelisle@gcc.gnu.org>
! Original test case by Chris <cmklaij@hetnet.nl>
......
! { dg-do "compile" }
! { dg-do compile }
!
! PR fortran/44457 - no array-subscript actual argument
! for an asynchronous dummy
......
! { dg-do "run" }
! { dg-do run }
! PR fortran/36795
! "(str)" (= an expression) was regarded as "str" (= a variable)
! and thus when yy was deallocated so was xx. Result: An invalid
......
! { dg-do "compile" }
! { dg-do compile }
! Test the final fix for PR42353, in which a compilation error was
! occurring because the derived type of the initializer of the vtab
! component '$extends' was not the same as that of the component.
......
! { dg-do "compile" }
! { dg-do compile }
!
! PR fortran/38404 - location marker in wrong line
! Testcase contributed by Steve Chapel <steve DOT chapel AT a2pg DOT com>
......
! { dg-do "compile" }
! { dg-do compile }
! { dg-options "-std=f95 -fmax-errors=0" }
!
! Testcases from PR fortran/24978
......
! { dg-do "run" }
! { dg-do run }
! Transformational intrinsic DOT_PRODUCT as initialization expression.
INTEGER, PARAMETER :: n = 10
......
! { dg-do "compile" }
! { dg-do compile }
! PR fortran/41369 - rejected empty type in function return values
module m
......
! { dg-do "compile" }
! { dg-do compile }
! { dg-options "-c" }
!
! Do not apply the SAVE attribute to function results.
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment