Update ChangeLog and version files for release
[official-gcc.git] / gcc / fortran / ChangeLog
blob335ca6b956b288a4fffafe5a550fbb29b91e3702
1 2016-08-22  Release Manager
3         * GCC 6.2.0 released.
5 2016-08-16  Thomas Koenig  <tkoenig@gcc.gnu.org>
7         Backport from trunk
8         * frontend-passes.c (create_var):  Set ts.deferred for
9         deferred-length character variables.
10         * dump-parse-tree.c (show_typespec):  Also dump
11         is_c_interop, is_iso_c and deferred flags.
13 2016-08-15  Jakub Jelinek  <jakub@redhat.com>
15         PR debug/71906
16         * trans-decl.c (gfc_get_symbol_decl): Call gfc_finish_var_decl
17         for decl's character length before gfc_finish_var_decl on the
18         decl itself.
20 2016-08-11  Andre Vehreschild  <vehre@gcc.gnu.org>
22         Backport from trunk:
23         PR fortran/71936
24         * trans-array.c (gfc_array_allocate): When SOURCE= is a function
25         stick with the ref of the object to allocate.
27 2016-08-11  Andre Vehreschild  <vehre@gcc.gnu.org>
29         Backport from trunk
30         PR fortran/72698
31         * trans-stmt.c (gfc_trans_allocate): Prevent generating code for
32         copy of zero sized string and with it an ICE.
34 2016-08-08  Andre Vehreschild  <vehre@gcc.gnu.org>
36         Backport from trunk:
37         PR fortran/70524
38         * trans-array.c (gfc_trans_dummy_array_bias): Ensure that the
39         location information is correctly set.
40         * trans-decl.c (gfc_trans_deferred_vars): Set the locus of the
41         current construct early.
43 2016-08-07  Thomas Koenig  <tkoenig@gcc.gnu.org>
45         PR fortran/71795
46         Backport from trunk
47         * frontend-passes.c (combine_array_constructor):  Don't
48         do anything if the expression is inside an array iterator.
50 2016-07-28  Steven G. Kargl  <kargl@gcc.gnu.org>
51             Thomas Koenig  <tkoenig@gcc.gnu.org>
53         Backported from trunk:
54         PR fortran/71883
55         * frontend-passes.c (gfc_run_passes): Bail out if there are any
56         errors.
57         * error.c (gfc_internal_error): If there are any errors in the
58         buffer, exit with EXIT_FAILURE.
60 2016-07-22  Andre Vehreschild  <vehre@gcc.gnu.org>
62         Backported from trunk:
63         PR fortran/71807
64         * trans-expr.c (gfc_trans_subcomponent_assign): Special casing
65         when allocatable component is set to null() in initializer.
67 2016-07-22  Andre Vehreschild  <vehre@gcc.gnu.org>
69         Backport from trunk:
70         PR fortran/70842
71         * simplify.c (gfc_simplify_len): Only for unlimited polymorphic
72         types replace the expression's _data ref with a _len ref.
74 2016-07-15  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
76         Backport from trunk:
77         PR fortran/71764
78         * trans-expr.c (gfc_trans_structure_assign): Remove assert.
80 2016-07-13  Andre Vehreschild  <vehre@gcc.gnu.org>
82         Backport from trunk:
83         PR fortran/71623
84         * trans-stmt.c (gfc_trans_allocate): Add code of pre block of typespec
85         in allocate to parent block.
87 2016-07-09  Thomas Koenig  <tkoenig@gcc.gnu.org>
89         Backport from trunk:
90         PR fortran/71783
91         * frontend-passes.c (create_var):  Always allocate a charlen
92         for character variables.
94 2016-07-08  Cesar Philippidis  <cesar@codesourcery.com>
96         Backport from trunk:
97         2016-07-08  Cesar Philippidis  <cesar@codesourcery.com>
99         * parse.c (matcha): Define.
100         (decode_oacc_directive): Add spec_only local var and set it.  Use
101         matcha to parse acc directives except for routine and declare.  Return
102         ST_GET_FCN_CHARACTERISTICS if a non-declarative directive could be
103         matched.
105 2016-07-02  Jakub Jelinek  <jakub@redhat.com>
107         Backported from mainline
108         2016-07-01  Jakub Jelinek  <jakub@redhat.com>
110         PR fortran/71687
111         * f95-lang.c (struct binding_level): Add reversed field.
112         (clear_binding_level): Adjust initializer.
113         (getdecls): If reversed is clear, set it and nreverse the names
114         chain before returning it.
115         (poplevel): Use getdecls.
116         * trans-decl.c (gfc_generate_function_code, gfc_process_block_locals):
117         Use nreverse to pushdecl decls in the declaration order.
119         PR fortran/71717
120         * trans-openmp.c (gfc_omp_privatize_by_reference): Return false
121         for GFC_DECL_ASSOCIATE_VAR_P with POINTER_TYPE.
123         2016-06-30  Jakub Jelinek  <jakub@redhat.com>
125         PR fortran/71704
126         * parse.c (matchs, matcho): Move right before decode_omp_directive.
127         If spec_only, only gfc_match the keyword and if successful, goto
128         do_spec_only.
129         (matchds, matchdo): Define.
130         (decode_omp_directive): Add spec_only local var and set it.
131         Use matchds or matchdo macros instead of matchs or matcho
132         for declare target, declare simd, declare reduction and threadprivate
133         directives.  Return ST_GET_FCN_CHARACTERISTICS if a non-declarative
134         directive could be matched.
135         (next_statement): For ST_GET_FCN_CHARACTERISTICS restore
136         gfc_current_locus from old_locus even if there is no label.
138         PR fortran/71705
139         * trans-openmp.c (gfc_trans_omp_clauses): Set TREE_ADDRESSABLE on
140         decls in to/from clauses.
142 2016-06-29  Cesar Philippidis  <cesar@codesourcery.com>
144         Back port from trunk
145         2016-06-29  Cesar Philippidis  <cesar@codesourcery.com>
147         * openmp.c (match_oacc_clause_gang): Rename to ...
148         (match_oacc_clause_gwv): this.  Add support for OpenACC worker and
149         vector clauses.
150         (gfc_match_omp_clauses): Use match_oacc_clause_gwv for
151         OMP_CLAUSE_{GANG,WORKER,VECTOR}.  Propagate any MATCH_ERRORs for
152         invalid OMP_CLAUSE_{ASYNC,WAIT,GANG,WORKER,VECTOR} clauses.
153         (gfc_match_oacc_wait): Propagate MATCH_ERROR for invalid
154         oacc_expr_lists.  Adjust the first and needs_space arguments to
155         gfc_match_omp_clauses.
157 2016-06-27  Paul Thomas  <pault@gcc.gnu.org>
159         PR fortran/70673
160         * frontend-passes.c (realloc_string_callback): Add a call to
161         gfc_dep_compare_expr.
163 2016-06-12  Dominique d'Humieres  <dominiq@lps.ens.fr>
165         PR fortran/60751
166         * io.c (gfc_resolve_dt): Replace GFC_STD_GNU with GFC_STD_LEGACY.
168 2016-06-10  Thomas Schwinge  <thomas@codesourcery.com>
170         PR c/71381
171         Backport from trunk r237290:
172         * openmp.c (gfc_match_oacc_cache): Add comment.
174 2016-06-05  Andre Vehreschild  <vehre@gcc.gnu.org>
176         PR fortran/69659
177         * trans-array.c (gfc_trans_dummy_array_bias): For class arrays use
178         the address of the _data component to reference the arrays data
179         component.
181 2016-06-01  Paul Thomas  <pault@gcc.gnu.org>
183         PR fortran/71156
184         * decl.c (copy_prefix): Add checks that the module procedure
185         declaration prefixes are compliant with the interface. Invert
186         order of existing elemental and pure checks.
187         * resolve.c (resolve_fl_procedure): Invert order of elemental
188         and pure errors.
190 2016-06-01  Jakub Jelinek  <jakub@redhat.com>
192         * parse.c (case_decl): Move ST_OMP_* to ...
193         (case_omp_decl): ... here, new macro.
194         (verify_st_order): For case_omp_decl, complain about
195         p->state >= ORDER_EXEC, but don't change p->state otherwise.
197 2016-05-26  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
199         Backport from trunk.
200         PR fortran/66461
201         * scanner.c (gfc_next_char_literal): Clear end_flag when adjusting
202         current locus back to old_locus.
204 2016-05-20  Jakub Jelinek  <jakub@redhat.com>
206         PR fortran/71204
207         * frontend-passes.c (realloc_string_callback): Clear inserted_block
208         and changed_statement before calling create_var.
210 2016-05-15  Harald Anlauf  <anlauf@gmx.de>
212         PR fortran/69603
213         * interface.c (compare_parameter): Check for non-NULL pointer.
215 2016-05-14  Fritz Reese  <fritzoreese@gmail.com>
217         Backport from trunk: r236242
218         * gfortran.texi: Update example of DEC UNION extension.
220         Backport from trunk: r236241
221         PR fortran/71047
222         * expr.c (gfc_default_initializer): Avoid extra component refs in
223         constructors for derived types and classes.
225         Backport from trunk: r235999
226         PR fortran/56226
227         * module.c (dt_upper_string): Rename to gfc_dt_upper_string
228         (dt_lower_string): Likewise.
229         * gfortran.h: Make new gfc_dt_upper/lower_string global.
230         * class.c: Use gfc_dt_upper_string.
231         * decl.c: Likewise.
232         * symbol.c: Likewise.
233         * resolve.c (resolve_component): New function.
234         (resolve_fl_derived0): Move component loop code to resolve_component.
235         * parse.c (check_component): New function.
236         (parse_derived): Move loop code to check_component.
237         * lang.opt, invoke.texi, options.c : New option -fdec-structure.
238         * libgfortran.h (bt): New basic type BT_UNION.
239         * gfortran.h (gfc_option): New option -fdec-structure.
240         (gfc_get_union_type, gfc_compare_union_types): New prototypes.
241         (gfc_bt_struct, gfc_fl_struct, case_bt_struct, case_fl_struct): New
242         macros.
243         (gfc_find_component): Change prototype.
244         * match.h (gfc_match_member_sep, gfc_match_map, gfc_match_union,
245         gfc_match_structure_decl): New prototypes.
246         * parse.h (gfc_comp_struct): New macro.
247         * symbol.c (gfc_find_component): Search for components in nested unions
248         * class.c (insert_component_ref, gfc_add_component_ref, add_proc_comp,
249         copy_vtab_proc_comps): Update calls to gfc_find_component.
250         * primary.c (gfc_convert_to_structure_constructor): Likewise.
251         * symbol.c (gfc_add_component): Likewise.
252         * resolve.c (resolve_typebound_function, resolve_typebound_subroutine,
253         resolve_typebound_procedure, resolve_component, resolve_fl_derived):
254         Likewise.
255         * expr.c (get_union_init, component_init): New functions.
256         * decl.c (match_clist_expr, match_record_decl, get_struct_decl,
257         gfc_match_map, gfc_match_union, gfc_match_structure_decl): Likewise.
258         * interface.c (compare_components, gfc_compare_union_types): Likewise.
259         * match.c (gfc_match_member_sep): Likewise.
260         * parse.c (check_component, parse_union, parse_struct_map): Likewise.
261         * resolve.c (resolve_fl_struct): Likewise.
262         * symbol.c (find_union_component): Likewise.
263         * trans-types.c (gfc_get_union_type): Likewise.
264         * parse.c (parse_derived): Use new functions.
265         * interface.c (gfc_compare_derived_types, gfc_compare_types): Likewise.
266         * expr.c (gfc_default_initializer): Likewise.
267         * gfortran.texi: Support for DEC structures, unions, and maps.
268         * gfortran.h (gfc_statement, sym_flavor): Likewise.
269         * check.c (gfc_check_kill_sub): Likewise.
270         * expr.c (gfc_copy_expr, simplify_const_ref,
271         gfc_has_default_initializer): Likewise.
272         * decl.c (build_sym, match_data_constant, add_init_expr_to_sym,
273         match_pointer_init, build_struct, variable_decl,
274         gfc_match_decl_type_spec, gfc_mach_data-decl, gfc_match_entry,
275         gfc_match_end, gfc_match_derived_decl): Likewise.
276         * interface.c (check_interface0, check_interface1,
277         gfc_search_interface): Likewise.
278         * misc.c (gfc_basic_typename, gfc_typename): Likewise.
279         * module.c (add_true_name, build_tnt, bt_types, mio_typespec,
280         fix_mio_expr, load_needed, mio_symbol, read_module, write_symbol,
281         gfc_get_module_backend_decl): Likewise.
282         * parse.h (gfc_compile_state): Likewise.
283         * parse.c (decode_specification_statement, decode_statement,
284         gfc_ascii_statement, verify_st_order, parse_spec): Likewise.
285         * primary.c (gfc_match_varspec, gfc_match_structure_constructor,
286         gfc_match_rvalue, match_variable): Likewise.
287         * resolve.c (find_arglists, resolve_structure_cons,
288         is_illegal_recursion, resolve_generic_f, get_declared_from_expr,
289         resolve_typebound_subroutine, resolve_allocate_expr,
290         nonscalar_typebound_assign, generate_component_assignments,
291         resolve_fl_variable_derived, check_defined_assignments,
292         resolve_component, resolve_symbol, resolve_equivalence_derived):
293         Likewise.
294         * symbol.c (flavors, check_conflict, gfc_add_flavor, gfc_use_derived,
295         gfc_restore_last_undo_checkpoint, gfc_type_compatible,
296         gfc_find_dt_in_generic): Likewise.
297         * trans-decl.c (gfc_get_module_backend_decl, create_function_arglist,
298         gfc_create_module_variable, check_constant_initializer): Likewise.
299         * trans-expr.c (gfc_conv_component_ref, gfc_conv_initializer,
300         gfc_trans_alloc_subarray_assign, gfc_trans_subcomponent_assign,
301         gfc_conv_structure, gfc_trans_scalar_assign, copyable_array_p):
302         Likewise.
303         * trans-io.c (transfer_namelist_element, transfer_expr,
304         gfc_trans_transfer): Likewise.
305         * trans-stmt.c (gfc_trans_deallocate): Likewise.
306         * trans-types.c (gfc_typenode_for_spec, gfc_copy_dt_decls_ifequal,
307         gfc_get_derived_type): Likewise.
309 2016-05-11  Jakub Jelinek  <jakub@redhat.com>
311         PR fortran/70855
312         * frontend-passes.c (inline_matmul_assign): Disable in !$omp workshare.
314 2016-04-29  Cesar Philippidis  <cesar@codesourcery.com>
316         PR middle-end/70626
317         * trans-openmp.c (gfc_trans_oacc_combined_directive): Duplicate
318         the reduction clause in both parallel and loop directives.
320 2016-04-27  Release Manager
322         * GCC 6.1.0 released.
324 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
326         PR fortran/67039
327         * intrinsic.texi: Correct the documentation of pseudorandom
328         number intrinsics.
330 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
332         PR fortran/58000
333         * gfortran.texi: Document OPEN( ... NAME=) as not implemented
334         in GNU Fortran
336 2016-04-09  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
338         PR fortran/68566
339         * array.c (match_array_element_spec): Add check for non-integer.
340         * simplify.c (gfc_simplify_reshape): If source shape is NULL return.
342 2016-04-06  Patrick Palka  <ppalka@gcc.gnu.org>
344         PR c/70436
345         * openmp.c (gfc_find_omp_udr): Add explicit braces to resolve a
346         future -Wparentheses warning.
348 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
350         PR fortran/67538
351         * resolve.c (resolve_allocate_expr): Emit error message when no
352         array spec and no array valued source= expression is given in an
353         F2008 allocate() for an array to allocate.
355 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
357         PR fortran/65795
358         * trans-array.c (gfc_array_allocate): When the array is a coarray,
359         do not nullyfing its allocatable components in array_allocate, because
360         the nullify missed the array ref and nullifies the wrong component.
361         Cosmetics.
363 2016-03-29  Andre Vehreschild  <vehre@gcc.gnu.org>
365         PR fortran/70397
366         * trans-expr.c (gfc_class_len_or_zero_get): Add function to return a
367         constant zero tree, when the class to get the _len component from is
368         not unlimited polymorphic.
369         (gfc_copy_class_to_class): Use the new function.
370         * trans.h: Added interface of new function gfc_class_len_or_zero_get.
372 2016-03-28  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
374         * trans-decl.c (gfc_build_builtin_function_decls):
375         caf_stop_numeric and caf_stop_str definition.
376         * trans-stmt.c (gfc_trans_stop): invoke external functions
377         for stop and stop_str when coarrays are used.
378         * trans.h: extern for new functions.
380 2016-03-19  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
382         PR fortran/69043
383         * scanner.c (load_file): Update to use S_ISREG macro.
385 2016-03-17  Thomas Schwinge  <thomas@codesourcery.com>
387         * gfortran.h (enum gfc_omp_map_op): Rename OMP_MAP_FORCE_DEALLOC
388         to OMP_MAP_DELETE.  Adjust all users.
390 2016-03-13  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
391             Jim MacArthur  <jim.macarthur@codethink.co.uk>
393         PR fortran/69043
394         * scanner.c (load_file): Check that included file is regular.
396 2016-03-12  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
397             Harold Anlauf  <anlauf@gmx.de>
399         PR fortran/69520
400         * invoke.texi: Explain use of the 'no-' construct within the
401         -fcheck= option.
402         * options.c (gfc_handle_runtime_check_option): Enable use of
403         'no-' prefix for the various options with -fcheck= to allow
404         negating previously enabled check options.
406 2016-03-12  Paul Thomas  <pault@gcc.gnu.org>
408         PR fortran/70031
409         * decl.c (gfc_match_prefix): Treat the 'module' prefix in the
410         same way as the others, rather than fixing it to come last.
411         (gfc_match_function_decl, gfc_match_subroutine): After errors
412         in 'copy_prefix', emit them immediately in the case of module
413         procedures to prevent a later ICE.
415         PR fortran/69524
416         * decl.c (gfc_match_submod_proc): Permit 'module procedure'
417         declarations within the contains section of modules as well as
418         submodules.
419         * resolve.c (resolve_fl_procedure): Likewise.
420         *trans-decl.c (build_function_decl): Change the gcc_assert to
421         allow all forms of module procedure declarations within module
422         contains sections.
424 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
426         PR fortran/68147
427         PR fortran/47674
428         * frontend-passes.c (realloc_string_callback): Don't set
429         walk_subtrees.
431 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
433         * dump-parse-tree.c (show_code_node):  Print association
434         list of a block if present.  Handle EXEC_END_BLOCK.
436 2016-02-28  Harald Anlauf <anlauf@gmx.de>
437             Jerry DeLisle  <jvdelisle@gcc.gnu.org>
439         PR fortran/56007
440         * match.c (gfc_match_iterator): Add diagnostic for array variable
441         as do loop index.
443 2016-02-27  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
444             Steven G. Kargl  <kargl@gcc.gnu.org>
446         PR fortran/69910
447         * io.c (gfc_match_open): Check that open status is an expression
448         constant before comparing string to 'scratch' with NEWUNIT.
450 2016-02-27  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
452         * trans.c (gfc_allocate_allocatable): size conversion
453         from byte to number of elements for event variables.
454         * trans-types.c (gfc_get_derived_type): event variables
455         represented as a pointer (like lock variable).
457 2016-02-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
459         PR fortran/61156
460         * scanner.c (add_path_to_list): If include path is not a directory,
461         issue a fatal error.
463 2016-02-23  Andre Vehreschild  <vehre@gcc.gnu.org>
465         PR fortran/67451
466         * trans-array.c (gfc_array_allocate): Take the attributes from the
467         expression to allocate and not from the source=-expression.
469 2016-02-20  Paul Thomas  <pault@gcc.gnu.org>
471         PR fortran/69423
472         * trans-decl.c (create_function_arglist): Deferred character
473         length functions, with and without declared results, address
474         the passed reference type as '.result' and the local string
475         length as '..result'.
476         (gfc_null_and_pass_deferred_len): Helper function to null and
477         return deferred string lengths, as needed.
478         (gfc_trans_deferred_vars): Call it, thereby reducing repeated
479         code, add call for deferred arrays and reroute pointer function
480         results. Avoid using 'tmp' for anything other that a temporary
481         tree by introducing 'type_of_array' for the arrayspec type.
483 2015-02-16  Thomas Koenig  <tkoenig@gcc.gnu.org>
485         PR fortran/69742
486         * frontend-passes.c (cfe-expr_0):  Don't register functions
487         from within an ASSOCIATE statement.
489 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
491         PR fortran/60526
492         * decl.c (build_sym):  If the name has already been defined as a
493         type, it has a symtree with an upper case letter at the beginning.
494         If such a symtree exists, issue an error and exit.  Don't do
495         this if there is no corresponding upper case letter.
497 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
499         PR fortran/60526
500         PR bootstrap/69816
501         * decl.c (build_sym):  Reverted previous patch.
503 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
505         PR fortran/60526
506         * decl.c (build_sym):  If the name has already been defined as a
507         type, issue error and return false.
509 2016-02-12  David Malcolm  <dmalcolm@redhat.com>
511         PR other/69554
512         * error.c (gfc_diagnostic_start_span): New function.
513         (gfc_diagnostics_init): Initialize global_dc's start_span.
515 2016-02-11  Andre Vehreschild  <vehre@gcc.gnu.org>
517         PR fortran/69296
518         * gfortran.h: Added flag to gfc_association_list indicating that
519         the rank of an associate variable has been guessed only.
520         * parse.c (parse_associate): Set the guess flag mentioned above
521         when guessing the rank of an expression.
522         * resolve.c (resolve_assoc_var): When the rank has been guessed,
523         make sure, that the guess was correct else overwrite with the actual
524         rank.
525         * trans-stmt.c (trans_associate_var): For subref_array_pointers in
526         class objects, take the span from the _data component.
528 2016-02-07  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
530         PR fortran/50555
531         * primary.c (match_actual_arg): If symbol has attribute flavor of
532         namelist, generate an error. (gfc_match_rvalue): Likewise return
533         MATCH_ERROR.
534         * resolve.c (resolve_symbol): Scan arument list of procedures and
535         generate an error if a namelist is found.
537 2016-02-05  Mikael Morin  <mikael@gcc.gnu.org>
539         PR fortran/66089
540         * trans-expr.c (expr_is_variable, gfc_expr_is_variable): Rename
541         the former to the latter and make it non-static.  Update callers.
542         * gfortran.h (gfc_expr_is_variable): New declaration.
543         (struct gfc_ss_info): Add field needs_temporary.
544         * trans-array.c (gfc_scalar_elemental_arg_saved_as_argument):
545         Tighten the condition on aggregate expressions with a check
546         that the expression is a variable and doesn't need a temporary.
547         (gfc_conv_resolve_dependency): Add intermediary reference variable.
548         Set the needs_temporary field.
550 2016-02-03  Andre Vehreschild  <vehre@gcc.gnu.org>
552         PR fortran/67451
553         PR fortran/69418
554         * trans-expr.c (gfc_copy_class_to_class): For coarrays just the
555         pointer is passed.  Take it as is without trying to deref the
556         _data component.
557         * trans-stmt.c (gfc_trans_allocate): Take care of coarrays as
558         argument to source=-expression.
560 2016-02-02  Nathan Sidwell  <nathan@codesourcery.com>
562         * lang.opt (fopenacc-dim=): New option.
564 2016-01-31  Paul Thomas  <pault@gcc.gnu.org>
566         PR fortran/67564
567         * trans-expr.c (gfc_conv_procedure_call): For the vtable copy
568         subroutines, add a string length argument, when the actual
569         argument is an unlimited polymorphic class object.
571 2016-01-30  Paul Thomas  <pault@gcc.gnu.org>
573         PR fortran/69566
574         * trans-expr.c (gfc_conv_procedure_call): Correct expression
575         for 'ulim_copy', which was missing a test for 'comp'.
577 2016-01-28  Andre Vehreschild  <vehre@gcc.gnu.org>
579         PR fortran/62536
580         * decl.c (gfc_match_end): Only unnest and remove BLOCK namespaces
581         when the END encountered does not match a BLOCK's end.
583 2016-01-27  Janus Weil  <janus@gcc.gnu.org>
585         PR fortran/69484
586         * invoke.texi: Fix documentation of -Wall with respect to -Wtabs.
588 2016-01-27  Paul Thomas  <pault@gcc.gnu.org>
590         PR fortran/69422
591         * trans-expr.c (is_scalar_reallocatable_lhs): Remove the check
592         for allocatable components, whilst checking if the symbol is a
593         derived or class entity..
595 2016-01-26  Paul Thomas  <pault@gcc.gnu.org>
597         PR fortran/69385
598         * trans-expr.c (gfc_trans_assignment_1): Exclude initialization
599         assignments from check on assignment of scalars to unassigned
600         arrays and correct wrong code within the corresponding block.
602 2016-01-26  David Malcolm  <dmalcolm@redhat.com>
604         PR other/69006
605         * error.c (gfc_diagnostic_starter): Delete use of pp_newline.
607 2016-01-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
609         PR fortran/69397
610         PR fortran/68442
611         * interface.c (gfc_arglist_matches_symbol): Replace assert with
612         a return false if not a procedure.
613         * resolve.c (resolve_generic_f): Test if we are resolving an
614         initialization expression and adjust error message accordingly.
616 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
618         PR fortran/66094
619         * frontend-passes.c (matmul_lhs_realloc):  Add
620         forgotten break statement.
622 2016-01-24  Dominique d'Humieres <dominiq@lps.ens.fr>
624         PR fortran/68283
625         * primary.c (gfc_variable_attr): revert revision r221955,
626         call gfc_internal_error only if there is no error.
628 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
630         PR fortran/66094
631         * frontend-passes.c (enum matrix_case):  Add case A2B2T for
632         MATMUL(A,TRANSPoSE(B)) where A and B are rank 2.
633         (inline_limit_check):  Also add A2B2T.
634         (matmul_lhs_realloc):  Handle A2B2T.
635         (check_conjg_variable):  Rename to
636         (check_conjg_transpose_variable):  and also count TRANSPOSE.
637         (inline_matmul_assign):  Handle A2B2T.
639 2016-01-21  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
641         PR fortran/65996
642         * error.c (gfc_error): Save the state of abort_on_error and set
643         it to false for buffered errors to allow normal processing.
644         Restore the state before leaving.
646 2016-01-19  Martin Jambor  <mjambor@suse.cz>
648         * types.def (BT_FN_VOID_UINT_PTR_INT_PTR): New.
649         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_INT_INT): Removed.
650         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_PTR): New.
652 2016-01-15  Paul Thomas  <pault@gcc.gnu.org>
654         PR fortran/64324
655         * resolve.c (check_uop_procedure): Prevent deferred length
656         characters from being trapped by assumed length error.
658         PR fortran/49630
659         PR fortran/54070
660         PR fortran/60593
661         PR fortran/60795
662         PR fortran/61147
663         PR fortran/64324
664         * trans-array.c (gfc_conv_scalarized_array_ref): Pass decl for
665         function as well as variable expressions.
666         (gfc_array_init_size): Add 'expr' as an argument. Use this to
667         correctly set the descriptor dtype for deferred characters.
668         (gfc_array_allocate): Add 'expr' to the call to
669         'gfc_array_init_size'.
670         * trans.c (gfc_build_array_ref): Expand logic for setting span
671         to include indirect references to character lengths.
672         * trans-decl.c (gfc_get_symbol_decl): Ensure that deferred
673         result char lengths that are PARM_DECLs are indirectly
674         referenced both for directly passed and by reference.
675         (create_function_arglist): If the length type is a pointer type
676         then store the length as the 'passed_length' and make the char
677         length an indirect reference to it.
678         (gfc_trans_deferred_vars): If a character length has escaped
679         being set as an indirect reference, return it via the 'passed
680         length'.
681         * trans-expr.c (gfc_conv_procedure_call): The length of
682         deferred character length results is set TREE_STATIC and set to
683         zero.
684         (gfc_trans_assignment_1): Do not fix the rse string_length if
685         it is a variable, a parameter or an indirect reference. Add the
686         code to trap assignment of scalars to unallocated arrays.
687         * trans-stmt.c (gfc_trans_allocate): Remove 'def_str_len' and
688         all references to it. Instead, replicate the code to obtain a
689         explicitly defined string length and provide a value before
690         array allocation so that the dtype is correctly set.
691         trans-types.c (gfc_get_character_type): If the character length
692         is a pointer, use the indirect reference.
694 2016-01-10  Thomas Koenig  <tkoenig@gcc.gnu.org>
696         PR fortran/69154
697         * frontend-passes.c (in_where):  New variable.
698         (inline_matmul_assign):  Don't try this if we are within
699         a WHERE statement.
700         (gfc_code_walker):  Keep track of in_where.
702 2016-01-10  Paul Thomas  <pault@gcc.gnu.org>
704         PR fortran/67779
705         * trans_array.c (gfc_conv_scalarized_array_ref): Add missing
706         se->use_offset from condition for calculation of 'base'.
708 2016-01-08  Jakub Jelinek  <jakub@redhat.com>
710         PR fortran/69128
711         * trans.h (OMPWS_SCALARIZER_BODY): Define.
712         (OMPWS_NOWAIT): Renumber.
713         * trans-stmt.c (gfc_trans_where_3): Only set OMPWS_SCALARIZER_WS
714         if OMPWS_SCALARIZER_BODY is not set already, and set also
715         OMPWS_SCALARIZER_BODY until the final loop creation.
716         * trans-expr.c (gfc_trans_assignment_1): Likewise.
717         * trans-openmp.c (gfc_trans_omp_workshare): Also clear
718         OMPWS_SCALARIZER_BODY.
719         * trans-array.c (gfc_trans_scalarized_loop_end): Don't create
720         OMP_FOR if OMPWS_SCALARIZER_BODY is set.
722 2016-01-04  Jakub Jelinek  <jakub@redhat.com>
724         Update copyright years.
726         * gfortranspec.c (lang_specific_driver): Update copyright notice
727         dates.
728         * gfc-internals.texi: Bump @copying's copyright year.
729         * gfortran.texi: Ditto.
730         * intrinsic.texi: Ditto.
731         * invoke.texi: Ditto.
733 2016-01-01  Paul Thomas  <pault@gcc.gnu.org>
735         PR fortran/68864
736         * trans-array.c (evaluate_bound): If deferred, test that 'desc'
737         is an array descriptor before using gfc_conv_descriptor_xxx.
739 Copyright (C) 2016 Free Software Foundation, Inc.
741 Copying and distribution of this file, with or without modification,
742 are permitted in any medium without royalty provided the copyright
743 notice and this notice are preserved.