Add qdf24xx base tuning support.
[official-gcc.git] / gcc / fortran / ChangeLog
blob8c91f183a324cb78e3b007c436be4d0ed4a1dd84
1 2016-06-29  Cesar Philippidis  <cesar@codesourcery.com>
3         * openmp.c (match_oacc_clause_gang): Rename to ...
4         (match_oacc_clause_gwv): this.  Add support for OpenACC worker and
5         vector clauses.
6         (gfc_match_omp_clauses): Use match_oacc_clause_gwv for
7         OMP_CLAUSE_{GANG,WORKER,VECTOR}.  Propagate any MATCH_ERRORs for
8         invalid OMP_CLAUSE_{ASYNC,WAIT,GANG,WORKER,VECTOR} clauses.
9         (gfc_match_oacc_wait): Propagate MATCH_ERROR for invalid
10         oacc_expr_lists.  Adjust the first and needs_space arguments to
11         gfc_match_omp_clauses.
13 2016-06-29  Richard Biener  <rguenther@suse.de>
15         PR middle-end/71002
16         * f95-lang.c (LANG_HOOKS_GET_ALIAS_SET): Remove (un-)define.
17         (gfc_get_alias_set): Remove.
19 2016-06-25  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
21         PR fortran/71649
22         * module.c (create_intrinsic_function): Check for NULL values and
23         return after giving error.
25 2016-06-21  Michael Meissner  <meissner@linux.vnet.ibm.com>
27         * trans-types.c (gfc_build_complex_type): Move setting complex
28         MODE to layout_type, instead of setting it ahead of time by the
29         caller.
31 2016-06-21  Tobias Burnus  <burnus@net-b.de>
33         PR fortran/71068
34         * resolve.c (resolve_function): Don't resolve caf_get/caf_send.
35         (check_data_variable): Strip-off caf_get before checking.
37 2016-06-20  Tobias Burnus  <burnus@net-b.de>
39         PR fortran/71194
40         * trans-expr.c (gfc_trans_pointer_assignment): Correctly handle
41         RHS pointer functions.
43 2016-06-19  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
45         * class.c (gfc_add_class_array_ref): Call gfc_add_data_component()
46         instead of gfc_add_component_ref().
47         (gfc_get_len_component): Call gfc_add_len_component() instead of
48         gfc_add_component_ref().
49         * trans-intrinsic.c (gfc_conv_intrinsic_loc): Call
50         gfc_add_data_component() instead of gfc_add_component_ref().
51         * trans.c (gfc_add_finalizer_call): Call
52         gfc_add_final_component() and gfc_add_size_component() instead
53         of gfc_add_component_ref.
55 2016-06-18  Bernhard Reutner-Fischer  <aldot@gcc.gnu.org>
57         * trans-types.c (gfc_typenode_for_spec): Commentary typo fix.
59 2016-06-17  Cesar Philippidis  <cesar@codesourcery.com>
61         * openmp.c (match_acc): New generic function to parse OpenACC
62         directives.
63         (gfc_match_oacc_parallel_loop): Use it.
64         (gfc_match_oacc_parallel): Likewise.
65         (gfc_match_oacc_kernels_loop): Likewise.
66         (gfc_match_oacc_kernels): Likewise.
67         (gfc_match_oacc_data): Likewise.
68         (gfc_match_oacc_host_data): Likewise.
69         (gfc_match_oacc_loop): Likewise.
70         (gfc_match_oacc_enter_data): Likewise.
71         (gfc_match_oacc_exit_data): Likewise.
73 2016-06-16  Martin Liska  <mliska@suse.cz>
75         * trans-stmt.c (gfc_trans_simple_do): Predict the edge.
77 2016-06-16  Martin Liska  <mliska@suse.cz>
79         * trans-array.c (gfc_array_allocate): Do not generate expect
80         stmt.
81         * trans.c (gfc_allocate_using_malloc): Properly set FAIL_ALLOC
82         predictor for malloc return value.
83         (gfc_allocate_allocatable): Use REALLOC predictor instead of
84         FAIL_ALLOC.
85         (gfc_deallocate_with_status): Likewise.
87 2016-06-13  Paul Thomas  <pault@gcc.gnu.org>
89         PR fortran/70673
90         * frontend-passes.c (realloc_string_callback): Add a call to
91         gfc_dep_compare_expr.
93 2016-06-11  Dominique d'Humieres  <dominiq@lps.ens.fr>
95         PR fortran/60751
96         * io.c (gfc_resolve_dt): Replace GFC_STD_GNU with GFC_STD_LEGACY.
98 2016-06-10  Thomas Schwinge  <thomas@codesourcery.com>
100         PR c/71381
101         * openmp.c (gfc_match_oacc_cache): Add comment.
103 2016-06-05  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
105         PR fortran/71404
106         * io.c (match_io): For READ, commit in pending symbols in the
107         current statement before trying to match an expression so that
108         if the match fails and we undo symbols we dont toss good symbols.
110 2016-06-05  Andre Vehreschild  <vehre@gcc.gnu.org>
112         PR fortran/69659
113         * trans-array.c (gfc_trans_dummy_array_bias): For class arrays use
114         the address of the _data component to reference the arrays data
115         component.
117 2016-06-03  Chung-Lin Tang  <cltang@codesourcery.com>
119         * trans-openmp.c (gfc_trans_omp_reduction_list): Add mark_addressable
120         bool parameter, set reduction clause DECLs as addressable when true.
121         (gfc_trans_omp_clauses): Pass clauses->async to
122         gfc_trans_omp_reduction_list, add comment describing OpenACC situation.
124 2016-06-01  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
126         PR fortran/52393
127         * io.c (match_io): For READ, try to match a default character
128         expression. If found, set the dt format expression to this,
129         otherwise go back and try control list.
131 2016-06-01  Paul Thomas  <pault@gcc.gnu.org>
133         PR fortran/71156
134         * decl.c (copy_prefix): Add checks that the module procedure
135         declaration prefixes are compliant with the interface. Invert
136         order of existing elemental and pure checks.
137         * resolve.c (resolve_fl_procedure): Invert order of elemental
138         and pure errors.
140 2016-06-01  Jakub Jelinek  <jakub@redhat.com>
142         * parse.c (case_decl): Move ST_OMP_* to ...
143         (case_omp_decl): ... here, new macro.
144         (verify_st_order): For case_omp_decl, complain about
145         p->state >= ORDER_EXEC, but don't change p->state otherwise.
147 2016-05-26  Jakub Jelinek  <jakub@redhat.com>
149         * openmp.c (resolve_omp_clauses): Warn if chunk_size is known not to
150         be positive.
152 2016-05-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
154         PR fortran/66461
155         * scanner.c (gfc_next_char_literal): Clear end_flag when adjusting
156         current locus back to old_locus.
158 2016-05-20  Jakub Jelinek  <jakub@redhat.com>
160         PR fortran/71204
161         * frontend-passes.c (realloc_string_callback): Clear inserted_block
162         and changed_statement before calling create_var.
164 2016-05-15  Harald Anlauf  <anlauf@gmx.de>
166         PR fortran/69603
167         * interface.c (compare_parameter): Check for non-NULL pointer.
169 2016-05-14  Fritz Reese  <fritzoreese@gmail.com>
171         * gfortran.texi: Update example of DEC UNION extension.
173 2016-05-14  Fritz Reese  <fritzoreese@gmail.com>
175         PR fortran/71047
176         * expr.c (gfc_default_initializer): Avoid extra component refs in
177         constructors for derived types and classes.
179 2016-05-11  Jakub Jelinek  <jakub@redhat.com>
181         PR fortran/70855
182         * frontend-passes.c (inline_matmul_assign): Disable in !$omp workshare.
184 2016-05-09  Richard Biener  <rguenther@suse.de>
186         PR fortran/70937
187         * trans-decl.c: Include gimplify.h for unshare_expr.
188         (gfc_trans_vla_one_sizepos): Unshare exprs before inserting
189         them into the IL.
191 2016-05-07  Fritz Reese  <fritzoreese@gmail.com>
193         PR fortran/56226
194         * module.c (dt_upper_string): Rename to gfc_dt_upper_string
195         (dt_lower_string): Likewise.
196         * gfortran.h: Make new gfc_dt_upper/lower_string global.
197         * class.c: Use gfc_dt_upper_string.
198         * decl.c: Likewise.
199         * symbol.c: Likewise.
200         * resolve.c (resolve_component): New function.
201         (resolve_fl_derived0): Move component loop code to resolve_component.
202         * parse.c (check_component): New function.
203         (parse_derived): Move loop code to check_component.
204         * lang.opt, invoke.texi, options.c : New option -fdec-structure.
205         * libgfortran.h (bt): New basic type BT_UNION.
206         * gfortran.h (gfc_option): New option -fdec-structure.
207         (gfc_get_union_type, gfc_compare_union_types): New prototypes.
208         (gfc_bt_struct, gfc_fl_struct, case_bt_struct, case_fl_struct): New
209         macros.
210         (gfc_find_component): Change prototype.
211         * match.h (gfc_match_member_sep, gfc_match_map, gfc_match_union,
212         gfc_match_structure_decl): New prototypes.
213         * parse.h (gfc_comp_struct): New macro.
214         * symbol.c (gfc_find_component): Search for components in nested unions
215         * class.c (insert_component_ref, gfc_add_component_ref, add_proc_comp,
216         copy_vtab_proc_comps): Update calls to gfc_find_component.
217         * primary.c (gfc_convert_to_structure_constructor): Likewise.
218         * symbol.c (gfc_add_component): Likewise.
219         * resolve.c (resolve_typebound_function, resolve_typebound_subroutine,
220         resolve_typebound_procedure, resolve_component, resolve_fl_derived):
221         Likewise.
222         * expr.c (get_union_init, component_init): New functions.
223         * decl.c (match_clist_expr, match_record_decl, get_struct_decl,
224         gfc_match_map, gfc_match_union, gfc_match_structure_decl): Likewise.
225         * interface.c (compare_components, gfc_compare_union_types): Likewise.
226         * match.c (gfc_match_member_sep): Likewise.
227         * parse.c (check_component, parse_union, parse_struct_map): Likewise.
228         * resolve.c (resolve_fl_struct): Likewise.
229         * symbol.c (find_union_component): Likewise.
230         * trans-types.c (gfc_get_union_type): Likewise.
231         * parse.c (parse_derived): Use new functions.
232         * interface.c (gfc_compare_derived_types, gfc_compare_types): Likewise.
233         * expr.c (gfc_default_initializer): Likewise.
234         * gfortran.texi: Support for DEC structures, unions, and maps.
235         * gfortran.h (gfc_statement, sym_flavor): Likewise.
236         * check.c (gfc_check_kill_sub): Likewise.
237         * expr.c (gfc_copy_expr, simplify_const_ref,
238         gfc_has_default_initializer): Likewise.
239         * decl.c (build_sym, match_data_constant, add_init_expr_to_sym,
240         match_pointer_init, build_struct, variable_decl,
241         gfc_match_decl_type_spec, gfc_mach_data-decl, gfc_match_entry,
242         gfc_match_end, gfc_match_derived_decl): Likewise.
243         * interface.c (check_interface0, check_interface1,
244         gfc_search_interface): Likewise.
245         * misc.c (gfc_basic_typename, gfc_typename): Likewise.
246         * module.c (add_true_name, build_tnt, bt_types, mio_typespec,
247         fix_mio_expr, load_needed, mio_symbol, read_module, write_symbol,
248         gfc_get_module_backend_decl): Likewise.
249         * parse.h (gfc_compile_state): Likewise.
250         * parse.c (decode_specification_statement, decode_statement,
251         gfc_ascii_statement, verify_st_order, parse_spec): Likewise.
252         * primary.c (gfc_match_varspec, gfc_match_structure_constructor,
253         gfc_match_rvalue, match_variable): Likewise.
254         * resolve.c (find_arglists, resolve_structure_cons,
255         is_illegal_recursion, resolve_generic_f, get_declared_from_expr,
256         resolve_typebound_subroutine, resolve_allocate_expr,
257         nonscalar_typebound_assign, generate_component_assignments,
258         resolve_fl_variable_derived, check_defined_assignments,
259         resolve_component, resolve_symbol, resolve_equivalence_derived):
260         Likewise.
261         * symbol.c (flavors, check_conflict, gfc_add_flavor, gfc_use_derived,
262         gfc_restore_last_undo_checkpoint, gfc_type_compatible,
263         gfc_find_dt_in_generic): Likewise.
264         * trans-decl.c (gfc_get_module_backend_decl, create_function_arglist,
265         gfc_create_module_variable, check_constant_initializer): Likewise.
266         * trans-expr.c (gfc_conv_component_ref, gfc_conv_initializer,
267         gfc_trans_alloc_subarray_assign, gfc_trans_subcomponent_assign,
268         gfc_conv_structure, gfc_trans_scalar_assign, copyable_array_p):
269         Likewise.
270         * trans-io.c (transfer_namelist_element, transfer_expr,
271         gfc_trans_transfer): Likewise.
272         * trans-stmt.c (gfc_trans_deallocate): Likewise.
273         * trans-types.c (gfc_typenode_for_spec, gfc_copy_dt_decls_ifequal,
274         gfc_get_derived_type): Likewise.
276 2016-05-05  Jakub Jelinek  <jakub@redhat.com>
278         * openmp.c (gfc_match_omp_clauses): Restructuralize, so that clause
279         parsing is done in a big switch based on gfc_peek_ascii_char and
280         individual clauses under their first letters are sorted too.
282 2016-05-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
284         * trans-types.c (gfc_build_complex_type):
286 2016-05-02  Richard Biener  <rguenther@suse.de>
288         * trans-array.c (gfc_trans_create_temp_array): Properly
289         create a DECL_EXPR for the anonymous VLA array type.
291 2016-04-29  Cesar Philippidis  <cesar@codesourcery.com>
293         PR middle-end/70626
294         * trans-openmp.c (gfc_trans_oacc_combined_directive): Duplicate
295         the reduction clause in both parallel and loop directives.
297 2016-04-18  Michael Matz  <matz@suse.de>
299         * trans-io.c (gfc_build_io_library_fndecls): Use SET_TYPE_ALIGN.
300         * trans-common.c (build_common_decl): Use SET_DECL_ALIGN.
301         * trans-types.c (gfc_add_field_to_struct): Use SET_DECL_ALIGN.
303 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
305         PR fortran/67039
306         * intrinsic.texi: Correct the documentation of pseudorandom
307         number intrinsics.
309 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
311         PR fortran/58000
312         * gfortran.texi: Document OPEN( ... NAME=) as not implemented
313         in GNU Fortran
315 2016-04-09  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
317         PR fortran/68566
318         * array.c (match_array_element_spec): Add check for non-integer.
319         * simplify.c (gfc_simplify_reshape): If source shape is NULL return.
321 2016-04-06  Patrick Palka  <ppalka@gcc.gnu.org>
323         PR c/70436
324         * openmp.c (gfc_find_omp_udr): Add explicit braces to resolve a
325         future -Wparentheses warning.
327 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
329         PR fortran/67538
330         * resolve.c (resolve_allocate_expr): Emit error message when no
331         array spec and no array valued source= expression is given in an
332         F2008 allocate() for an array to allocate.
334 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
336         PR fortran/65795
337         * trans-array.c (gfc_array_allocate): When the array is a coarray,
338         do not nullyfing its allocatable components in array_allocate, because
339         the nullify missed the array ref and nullifies the wrong component.
340         Cosmetics.
342 2016-03-29  Andre Vehreschild  <vehre@gcc.gnu.org>
344         PR fortran/70397
345         * trans-expr.c (gfc_class_len_or_zero_get): Add function to return a
346         constant zero tree, when the class to get the _len component from is
347         not unlimited polymorphic.
348         (gfc_copy_class_to_class): Use the new function.
349         * trans.h: Added interface of new function gfc_class_len_or_zero_get.
351 2016-03-28  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
353         * trans-decl.c (gfc_build_builtin_function_decls):
354         caf_stop_numeric and caf_stop_str definition.
355         * trans-stmt.c (gfc_trans_stop): invoke external functions
356         for stop and stop_str when coarrays are used.
357         * trans.h: extern for new functions.
359 2016-03-19  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
361         PR fortran/69043
362         * scanner.c (load_file): Update to use S_ISREG macro.
364 2016-03-17  Thomas Schwinge  <thomas@codesourcery.com>
366         * gfortran.h (enum gfc_omp_map_op): Rename OMP_MAP_FORCE_DEALLOC
367         to OMP_MAP_DELETE.  Adjust all users.
369 2016-03-13  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
370             Jim MacArthur  <jim.macarthur@codethink.co.uk>
372         PR fortran/69043
373         * scanner.c (load_file): Check that included file is regular.
375 2016-03-12  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
376             Harold Anlauf  <anlauf@gmx.de>
378         PR fortran/69520
379         * invoke.texi: Explain use of the 'no-' construct within the
380         -fcheck= option.
381         * options.c (gfc_handle_runtime_check_option): Enable use of
382         'no-' prefix for the various options with -fcheck= to allow
383         negating previously enabled check options.
385 2016-03-12  Paul Thomas  <pault@gcc.gnu.org>
387         PR fortran/70031
388         * decl.c (gfc_match_prefix): Treat the 'module' prefix in the
389         same way as the others, rather than fixing it to come last.
390         (gfc_match_function_decl, gfc_match_subroutine): After errors
391         in 'copy_prefix', emit them immediately in the case of module
392         procedures to prevent a later ICE.
394         PR fortran/69524
395         * decl.c (gfc_match_submod_proc): Permit 'module procedure'
396         declarations within the contains section of modules as well as
397         submodules.
398         * resolve.c (resolve_fl_procedure): Likewise.
399         *trans-decl.c (build_function_decl): Change the gcc_assert to
400         allow all forms of module procedure declarations within module
401         contains sections.
403 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
405         PR fortran/68147
406         PR fortran/47674
407         * frontend-passes.c (realloc_string_callback): Don't set
408         walk_subtrees.
410 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
412         * dump-parse-tree.c (show_code_node):  Print association
413         list of a block if present.  Handle EXEC_END_BLOCK.
415 2016-02-28  Harald Anlauf <anlauf@gmx.de>
416             Jerry DeLisle  <jvdelisle@gcc.gnu.org>
418         PR fortran/56007
419         * match.c (gfc_match_iterator): Add diagnostic for array variable
420         as do loop index.
422 2016-02-27  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
423             Steven G. Kargl  <kargl@gcc.gnu.org>
425         PR fortran/69910
426         * io.c (gfc_match_open): Check that open status is an expression
427         constant before comparing string to 'scratch' with NEWUNIT.
429 2016-02-27  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
431         * trans.c (gfc_allocate_allocatable): size conversion
432         from byte to number of elements for event variables.
433         * trans-types.c (gfc_get_derived_type): event variables
434         represented as a pointer (like lock variable).
436 2016-02-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
438         PR fortran/61156
439         * scanner.c (add_path_to_list): If include path is not a directory,
440         issue a fatal error.
442 2016-02-23  Andre Vehreschild  <vehre@gcc.gnu.org>
444         PR fortran/67451
445         * trans-array.c (gfc_array_allocate): Take the attributes from the
446         expression to allocate and not from the source=-expression.
448 2016-02-20  Paul Thomas  <pault@gcc.gnu.org>
450         PR fortran/69423
451         * trans-decl.c (create_function_arglist): Deferred character
452         length functions, with and without declared results, address
453         the passed reference type as '.result' and the local string
454         length as '..result'.
455         (gfc_null_and_pass_deferred_len): Helper function to null and
456         return deferred string lengths, as needed.
457         (gfc_trans_deferred_vars): Call it, thereby reducing repeated
458         code, add call for deferred arrays and reroute pointer function
459         results. Avoid using 'tmp' for anything other that a temporary
460         tree by introducing 'type_of_array' for the arrayspec type.
462 2015-02-16  Thomas Koenig  <tkoenig@gcc.gnu.org>
464         PR fortran/69742
465         * frontend-passes.c (cfe-expr_0):  Don't register functions
466         from within an ASSOCIATE statement.
468 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
470         PR fortran/60526
471         * decl.c (build_sym):  If the name has already been defined as a
472         type, it has a symtree with an upper case letter at the beginning.
473         If such a symtree exists, issue an error and exit.  Don't do
474         this if there is no corresponding upper case letter.
476 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
478         PR fortran/60526
479         PR bootstrap/69816
480         * decl.c (build_sym):  Reverted previous patch.
482 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
484         PR fortran/60526
485         * decl.c (build_sym):  If the name has already been defined as a
486         type, issue error and return false.
488 2016-02-12  David Malcolm  <dmalcolm@redhat.com>
490         PR other/69554
491         * error.c (gfc_diagnostic_start_span): New function.
492         (gfc_diagnostics_init): Initialize global_dc's start_span.
494 2016-02-11  Andre Vehreschild  <vehre@gcc.gnu.org>
496         PR fortran/69296
497         * gfortran.h: Added flag to gfc_association_list indicating that
498         the rank of an associate variable has been guessed only.
499         * parse.c (parse_associate): Set the guess flag mentioned above
500         when guessing the rank of an expression.
501         * resolve.c (resolve_assoc_var): When the rank has been guessed,
502         make sure, that the guess was correct else overwrite with the actual
503         rank.
504         * trans-stmt.c (trans_associate_var): For subref_array_pointers in
505         class objects, take the span from the _data component.
507 2016-02-07  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
509         PR fortran/50555
510         * primary.c (match_actual_arg): If symbol has attribute flavor of
511         namelist, generate an error. (gfc_match_rvalue): Likewise return
512         MATCH_ERROR.
513         * resolve.c (resolve_symbol): Scan arument list of procedures and
514         generate an error if a namelist is found.
516 2016-02-05  Mikael Morin  <mikael@gcc.gnu.org>
518         PR fortran/66089
519         * trans-expr.c (expr_is_variable, gfc_expr_is_variable): Rename
520         the former to the latter and make it non-static.  Update callers.
521         * gfortran.h (gfc_expr_is_variable): New declaration.
522         (struct gfc_ss_info): Add field needs_temporary.
523         * trans-array.c (gfc_scalar_elemental_arg_saved_as_argument):
524         Tighten the condition on aggregate expressions with a check
525         that the expression is a variable and doesn't need a temporary.
526         (gfc_conv_resolve_dependency): Add intermediary reference variable.
527         Set the needs_temporary field.
529 2016-02-03  Andre Vehreschild  <vehre@gcc.gnu.org>
531         PR fortran/67451
532         PR fortran/69418
533         * trans-expr.c (gfc_copy_class_to_class): For coarrays just the
534         pointer is passed.  Take it as is without trying to deref the
535         _data component.
536         * trans-stmt.c (gfc_trans_allocate): Take care of coarrays as
537         argument to source=-expression.
539 2016-02-02  Nathan Sidwell  <nathan@codesourcery.com>
541         * lang.opt (fopenacc-dim=): New option.
543 2016-01-31  Paul Thomas  <pault@gcc.gnu.org>
545         PR fortran/67564
546         * trans-expr.c (gfc_conv_procedure_call): For the vtable copy
547         subroutines, add a string length argument, when the actual
548         argument is an unlimited polymorphic class object.
550 2016-01-30  Paul Thomas  <pault@gcc.gnu.org>
552         PR fortran/69566
553         * trans-expr.c (gfc_conv_procedure_call): Correct expression
554         for 'ulim_copy', which was missing a test for 'comp'.
556 2016-01-28  Andre Vehreschild  <vehre@gcc.gnu.org>
558         PR fortran/62536
559         * decl.c (gfc_match_end): Only unnest and remove BLOCK namespaces
560         when the END encountered does not match a BLOCK's end.
562 2016-01-27  Janus Weil  <janus@gcc.gnu.org>
564         PR fortran/69484
565         * invoke.texi: Fix documentation of -Wall with respect to -Wtabs.
567 2016-01-27  Paul Thomas  <pault@gcc.gnu.org>
569         PR fortran/69422
570         * trans-expr.c (is_scalar_reallocatable_lhs): Remove the check
571         for allocatable components, whilst checking if the symbol is a
572         derived or class entity..
574 2016-01-26  Paul Thomas  <pault@gcc.gnu.org>
576         PR fortran/69385
577         * trans-expr.c (gfc_trans_assignment_1): Exclude initialization
578         assignments from check on assignment of scalars to unassigned
579         arrays and correct wrong code within the corresponding block.
581 2016-01-26  David Malcolm  <dmalcolm@redhat.com>
583         PR other/69006
584         * error.c (gfc_diagnostic_starter): Delete use of pp_newline.
586 2016-01-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
588         PR fortran/69397
589         PR fortran/68442
590         * interface.c (gfc_arglist_matches_symbol): Replace assert with
591         a return false if not a procedure.
592         * resolve.c (resolve_generic_f): Test if we are resolving an
593         initialization expression and adjust error message accordingly.
595 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
597         PR fortran/66094
598         * frontend-passes.c (matmul_lhs_realloc):  Add
599         forgotten break statement.
601 2016-01-24  Dominique d'Humieres <dominiq@lps.ens.fr>
603         PR fortran/68283
604         * primary.c (gfc_variable_attr): revert revision r221955,
605         call gfc_internal_error only if there is no error.
607 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
609         PR fortran/66094
610         * frontend-passes.c (enum matrix_case):  Add case A2B2T for
611         MATMUL(A,TRANSPoSE(B)) where A and B are rank 2.
612         (inline_limit_check):  Also add A2B2T.
613         (matmul_lhs_realloc):  Handle A2B2T.
614         (check_conjg_variable):  Rename to
615         (check_conjg_transpose_variable):  and also count TRANSPOSE.
616         (inline_matmul_assign):  Handle A2B2T.
618 2016-01-21  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
620         PR fortran/65996
621         * error.c (gfc_error): Save the state of abort_on_error and set
622         it to false for buffered errors to allow normal processing.
623         Restore the state before leaving.
625 2016-01-19  Martin Jambor  <mjambor@suse.cz>
627         * types.def (BT_FN_VOID_UINT_PTR_INT_PTR): New.
628         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_INT_INT): Removed.
629         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_PTR): New.
631 2016-01-15  Paul Thomas  <pault@gcc.gnu.org>
633         PR fortran/64324
634         * resolve.c (check_uop_procedure): Prevent deferred length
635         characters from being trapped by assumed length error.
637         PR fortran/49630
638         PR fortran/54070
639         PR fortran/60593
640         PR fortran/60795
641         PR fortran/61147
642         PR fortran/64324
643         * trans-array.c (gfc_conv_scalarized_array_ref): Pass decl for
644         function as well as variable expressions.
645         (gfc_array_init_size): Add 'expr' as an argument. Use this to
646         correctly set the descriptor dtype for deferred characters.
647         (gfc_array_allocate): Add 'expr' to the call to
648         'gfc_array_init_size'.
649         * trans.c (gfc_build_array_ref): Expand logic for setting span
650         to include indirect references to character lengths.
651         * trans-decl.c (gfc_get_symbol_decl): Ensure that deferred
652         result char lengths that are PARM_DECLs are indirectly
653         referenced both for directly passed and by reference.
654         (create_function_arglist): If the length type is a pointer type
655         then store the length as the 'passed_length' and make the char
656         length an indirect reference to it.
657         (gfc_trans_deferred_vars): If a character length has escaped
658         being set as an indirect reference, return it via the 'passed
659         length'.
660         * trans-expr.c (gfc_conv_procedure_call): The length of
661         deferred character length results is set TREE_STATIC and set to
662         zero.
663         (gfc_trans_assignment_1): Do not fix the rse string_length if
664         it is a variable, a parameter or an indirect reference. Add the
665         code to trap assignment of scalars to unallocated arrays.
666         * trans-stmt.c (gfc_trans_allocate): Remove 'def_str_len' and
667         all references to it. Instead, replicate the code to obtain a
668         explicitly defined string length and provide a value before
669         array allocation so that the dtype is correctly set.
670         trans-types.c (gfc_get_character_type): If the character length
671         is a pointer, use the indirect reference.
673 2016-01-10  Thomas Koenig  <tkoenig@gcc.gnu.org>
675         PR fortran/69154
676         * frontend-passes.c (in_where):  New variable.
677         (inline_matmul_assign):  Don't try this if we are within
678         a WHERE statement.
679         (gfc_code_walker):  Keep track of in_where.
681 2016-01-10  Paul Thomas  <pault@gcc.gnu.org>
683         PR fortran/67779
684         * trans_array.c (gfc_conv_scalarized_array_ref): Add missing
685         se->use_offset from condition for calculation of 'base'.
687 2016-01-08  Jakub Jelinek  <jakub@redhat.com>
689         PR fortran/69128
690         * trans.h (OMPWS_SCALARIZER_BODY): Define.
691         (OMPWS_NOWAIT): Renumber.
692         * trans-stmt.c (gfc_trans_where_3): Only set OMPWS_SCALARIZER_WS
693         if OMPWS_SCALARIZER_BODY is not set already, and set also
694         OMPWS_SCALARIZER_BODY until the final loop creation.
695         * trans-expr.c (gfc_trans_assignment_1): Likewise.
696         * trans-openmp.c (gfc_trans_omp_workshare): Also clear
697         OMPWS_SCALARIZER_BODY.
698         * trans-array.c (gfc_trans_scalarized_loop_end): Don't create
699         OMP_FOR if OMPWS_SCALARIZER_BODY is set.
701 2016-01-04  Jakub Jelinek  <jakub@redhat.com>
703         Update copyright years.
705         * gfortranspec.c (lang_specific_driver): Update copyright notice
706         dates.
707         * gfc-internals.texi: Bump @copying's copyright year.
708         * gfortran.texi: Ditto.
709         * intrinsic.texi: Ditto.
710         * invoke.texi: Ditto.
712 2016-01-01  Paul Thomas  <pault@gcc.gnu.org>
714         PR fortran/68864
715         * trans-array.c (evaluate_bound): If deferred, test that 'desc'
716         is an array descriptor before using gfc_conv_descriptor_xxx.
718 Copyright (C) 2016 Free Software Foundation, Inc.
720 Copying and distribution of this file, with or without modification,
721 are permitted in any medium without royalty provided the copyright
722 notice and this notice are preserved.