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