* tree.c (array_at_struct_end_p): Look through MEM_REF.
[official-gcc.git] / gcc / fortran / ChangeLog
blobd32c7d5100a9fb54173a14ce28170e4d30b8b168
1 2016-05-20  Jakub Jelinek  <jakub@redhat.com>
3         PR fortran/71204
4         * frontend-passes.c (realloc_string_callback): Clear inserted_block
5         and changed_statement before calling create_var.
7 2016-05-15  Harald Anlauf  <anlauf@gmx.de>
9         PR fortran/69603
10         * interface.c (compare_parameter): Check for non-NULL pointer.
12 2016-05-14  Fritz Reese  <fritzoreese@gmail.com>
14         * gfortran.texi: Update example of DEC UNION extension.
16 2016-05-14  Fritz Reese  <fritzoreese@gmail.com>
18         PR fortran/71047
19         * expr.c (gfc_default_initializer): Avoid extra component refs in
20         constructors for derived types and classes.
22 2016-05-11  Jakub Jelinek  <jakub@redhat.com>
24         PR fortran/70855
25         * frontend-passes.c (inline_matmul_assign): Disable in !$omp workshare.
27 2016-05-09  Richard Biener  <rguenther@suse.de>
29         PR fortran/70937
30         * trans-decl.c: Include gimplify.h for unshare_expr.
31         (gfc_trans_vla_one_sizepos): Unshare exprs before inserting
32         them into the IL.
34 2016-05-07  Fritz Reese  <fritzoreese@gmail.com>
36         PR fortran/56226
37         * module.c (dt_upper_string): Rename to gfc_dt_upper_string
38         (dt_lower_string): Likewise.
39         * gfortran.h: Make new gfc_dt_upper/lower_string global.
40         * class.c: Use gfc_dt_upper_string.
41         * decl.c: Likewise.
42         * symbol.c: Likewise.
43         * resolve.c (resolve_component): New function.
44         (resolve_fl_derived0): Move component loop code to resolve_component.
45         * parse.c (check_component): New function.
46         (parse_derived): Move loop code to check_component.
47         * lang.opt, invoke.texi, options.c : New option -fdec-structure.
48         * libgfortran.h (bt): New basic type BT_UNION.
49         * gfortran.h (gfc_option): New option -fdec-structure.
50         (gfc_get_union_type, gfc_compare_union_types): New prototypes.
51         (gfc_bt_struct, gfc_fl_struct, case_bt_struct, case_fl_struct): New
52         macros.
53         (gfc_find_component): Change prototype.
54         * match.h (gfc_match_member_sep, gfc_match_map, gfc_match_union,
55         gfc_match_structure_decl): New prototypes.
56         * parse.h (gfc_comp_struct): New macro.
57         * symbol.c (gfc_find_component): Search for components in nested unions
58         * class.c (insert_component_ref, gfc_add_component_ref, add_proc_comp,
59         copy_vtab_proc_comps): Update calls to gfc_find_component.
60         * primary.c (gfc_convert_to_structure_constructor): Likewise.
61         * symbol.c (gfc_add_component): Likewise.
62         * resolve.c (resolve_typebound_function, resolve_typebound_subroutine,
63         resolve_typebound_procedure, resolve_component, resolve_fl_derived):
64         Likewise.
65         * expr.c (get_union_init, component_init): New functions.
66         * decl.c (match_clist_expr, match_record_decl, get_struct_decl,
67         gfc_match_map, gfc_match_union, gfc_match_structure_decl): Likewise.
68         * interface.c (compare_components, gfc_compare_union_types): Likewise.
69         * match.c (gfc_match_member_sep): Likewise.
70         * parse.c (check_component, parse_union, parse_struct_map): Likewise.
71         * resolve.c (resolve_fl_struct): Likewise.
72         * symbol.c (find_union_component): Likewise.
73         * trans-types.c (gfc_get_union_type): Likewise.
74         * parse.c (parse_derived): Use new functions.
75         * interface.c (gfc_compare_derived_types, gfc_compare_types): Likewise.
76         * expr.c (gfc_default_initializer): Likewise.
77         * gfortran.texi: Support for DEC structures, unions, and maps.
78         * gfortran.h (gfc_statement, sym_flavor): Likewise.
79         * check.c (gfc_check_kill_sub): Likewise.
80         * expr.c (gfc_copy_expr, simplify_const_ref,
81         gfc_has_default_initializer): Likewise.
82         * decl.c (build_sym, match_data_constant, add_init_expr_to_sym,
83         match_pointer_init, build_struct, variable_decl,
84         gfc_match_decl_type_spec, gfc_mach_data-decl, gfc_match_entry,
85         gfc_match_end, gfc_match_derived_decl): Likewise.
86         * interface.c (check_interface0, check_interface1,
87         gfc_search_interface): Likewise.
88         * misc.c (gfc_basic_typename, gfc_typename): Likewise.
89         * module.c (add_true_name, build_tnt, bt_types, mio_typespec,
90         fix_mio_expr, load_needed, mio_symbol, read_module, write_symbol,
91         gfc_get_module_backend_decl): Likewise.
92         * parse.h (gfc_compile_state): Likewise.
93         * parse.c (decode_specification_statement, decode_statement,
94         gfc_ascii_statement, verify_st_order, parse_spec): Likewise.
95         * primary.c (gfc_match_varspec, gfc_match_structure_constructor,
96         gfc_match_rvalue, match_variable): Likewise.
97         * resolve.c (find_arglists, resolve_structure_cons,
98         is_illegal_recursion, resolve_generic_f, get_declared_from_expr,
99         resolve_typebound_subroutine, resolve_allocate_expr,
100         nonscalar_typebound_assign, generate_component_assignments,
101         resolve_fl_variable_derived, check_defined_assignments,
102         resolve_component, resolve_symbol, resolve_equivalence_derived):
103         Likewise.
104         * symbol.c (flavors, check_conflict, gfc_add_flavor, gfc_use_derived,
105         gfc_restore_last_undo_checkpoint, gfc_type_compatible,
106         gfc_find_dt_in_generic): Likewise.
107         * trans-decl.c (gfc_get_module_backend_decl, create_function_arglist,
108         gfc_create_module_variable, check_constant_initializer): Likewise.
109         * trans-expr.c (gfc_conv_component_ref, gfc_conv_initializer,
110         gfc_trans_alloc_subarray_assign, gfc_trans_subcomponent_assign,
111         gfc_conv_structure, gfc_trans_scalar_assign, copyable_array_p):
112         Likewise.
113         * trans-io.c (transfer_namelist_element, transfer_expr,
114         gfc_trans_transfer): Likewise.
115         * trans-stmt.c (gfc_trans_deallocate): Likewise.
116         * trans-types.c (gfc_typenode_for_spec, gfc_copy_dt_decls_ifequal,
117         gfc_get_derived_type): Likewise.
119 2016-05-05  Jakub Jelinek  <jakub@redhat.com>
121         * openmp.c (gfc_match_omp_clauses): Restructuralize, so that clause
122         parsing is done in a big switch based on gfc_peek_ascii_char and
123         individual clauses under their first letters are sorted too.
125 2016-05-02  Michael Meissner  <meissner@linux.vnet.ibm.com>
127         * trans-types.c (gfc_build_complex_type):
129 2016-05-02  Richard Biener  <rguenther@suse.de>
131         * trans-array.c (gfc_trans_create_temp_array): Properly
132         create a DECL_EXPR for the anonymous VLA array type.
134 2016-04-29  Cesar Philippidis  <cesar@codesourcery.com>
136         PR middle-end/70626
137         * trans-openmp.c (gfc_trans_oacc_combined_directive): Duplicate
138         the reduction clause in both parallel and loop directives.
140 2016-04-18  Michael Matz  <matz@suse.de>
142         * trans-io.c (gfc_build_io_library_fndecls): Use SET_TYPE_ALIGN.
143         * trans-common.c (build_common_decl): Use SET_DECL_ALIGN.
144         * trans-types.c (gfc_add_field_to_struct): Use SET_DECL_ALIGN.
146 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
148         PR fortran/67039
149         * intrinsic.texi: Correct the documentation of pseudorandom
150         number intrinsics.
152 2016-04-13  Dominique d'Humieres  <dominiq@lps.ens.fr>
154         PR fortran/58000
155         * gfortran.texi: Document OPEN( ... NAME=) as not implemented
156         in GNU Fortran
158 2016-04-09  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
160         PR fortran/68566
161         * array.c (match_array_element_spec): Add check for non-integer.
162         * simplify.c (gfc_simplify_reshape): If source shape is NULL return.
164 2016-04-06  Patrick Palka  <ppalka@gcc.gnu.org>
166         PR c/70436
167         * openmp.c (gfc_find_omp_udr): Add explicit braces to resolve a
168         future -Wparentheses warning.
170 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
172         PR fortran/67538
173         * resolve.c (resolve_allocate_expr): Emit error message when no
174         array spec and no array valued source= expression is given in an
175         F2008 allocate() for an array to allocate.
177 2016-04-04  Andre Vehreschild  <vehre@gcc.gnu.org>
179         PR fortran/65795
180         * trans-array.c (gfc_array_allocate): When the array is a coarray,
181         do not nullyfing its allocatable components in array_allocate, because
182         the nullify missed the array ref and nullifies the wrong component.
183         Cosmetics.
185 2016-03-29  Andre Vehreschild  <vehre@gcc.gnu.org>
187         PR fortran/70397
188         * trans-expr.c (gfc_class_len_or_zero_get): Add function to return a
189         constant zero tree, when the class to get the _len component from is
190         not unlimited polymorphic.
191         (gfc_copy_class_to_class): Use the new function.
192         * trans.h: Added interface of new function gfc_class_len_or_zero_get.
194 2016-03-28  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
196         * trans-decl.c (gfc_build_builtin_function_decls):
197         caf_stop_numeric and caf_stop_str definition.
198         * trans-stmt.c (gfc_trans_stop): invoke external functions
199         for stop and stop_str when coarrays are used.
200         * trans.h: extern for new functions.
202 2016-03-19  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
204         PR fortran/69043
205         * scanner.c (load_file): Update to use S_ISREG macro.
207 2016-03-17  Thomas Schwinge  <thomas@codesourcery.com>
209         * gfortran.h (enum gfc_omp_map_op): Rename OMP_MAP_FORCE_DEALLOC
210         to OMP_MAP_DELETE.  Adjust all users.
212 2016-03-13  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
213             Jim MacArthur  <jim.macarthur@codethink.co.uk>
215         PR fortran/69043
216         * scanner.c (load_file): Check that included file is regular.
218 2016-03-12  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
219             Harold Anlauf  <anlauf@gmx.de>
221         PR fortran/69520
222         * invoke.texi: Explain use of the 'no-' construct within the
223         -fcheck= option.
224         * options.c (gfc_handle_runtime_check_option): Enable use of
225         'no-' prefix for the various options with -fcheck= to allow
226         negating previously enabled check options.
228 2016-03-12  Paul Thomas  <pault@gcc.gnu.org>
230         PR fortran/70031
231         * decl.c (gfc_match_prefix): Treat the 'module' prefix in the
232         same way as the others, rather than fixing it to come last.
233         (gfc_match_function_decl, gfc_match_subroutine): After errors
234         in 'copy_prefix', emit them immediately in the case of module
235         procedures to prevent a later ICE.
237         PR fortran/69524
238         * decl.c (gfc_match_submod_proc): Permit 'module procedure'
239         declarations within the contains section of modules as well as
240         submodules.
241         * resolve.c (resolve_fl_procedure): Likewise.
242         *trans-decl.c (build_function_decl): Change the gcc_assert to
243         allow all forms of module procedure declarations within module
244         contains sections.
246 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
248         PR fortran/68147
249         PR fortran/47674
250         * frontend-passes.c (realloc_string_callback): Don't set
251         walk_subtrees.
253 2016-02-28  Thomas Koenig  <tkoenig@gcc.gnu.org>
255         * dump-parse-tree.c (show_code_node):  Print association
256         list of a block if present.  Handle EXEC_END_BLOCK.
258 2016-02-28  Harald Anlauf <anlauf@gmx.de>
259             Jerry DeLisle  <jvdelisle@gcc.gnu.org>
261         PR fortran/56007
262         * match.c (gfc_match_iterator): Add diagnostic for array variable
263         as do loop index.
265 2016-02-27  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
266             Steven G. Kargl  <kargl@gcc.gnu.org>
268         PR fortran/69910
269         * io.c (gfc_match_open): Check that open status is an expression
270         constant before comparing string to 'scratch' with NEWUNIT.
272 2016-02-27  Alessandro Fanfarillo  <fanfarillo.gcc@gmail.com>
274         * trans.c (gfc_allocate_allocatable): size conversion
275         from byte to number of elements for event variables.
276         * trans-types.c (gfc_get_derived_type): event variables
277         represented as a pointer (like lock variable).
279 2016-02-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
281         PR fortran/61156
282         * scanner.c (add_path_to_list): If include path is not a directory,
283         issue a fatal error.
285 2016-02-23  Andre Vehreschild  <vehre@gcc.gnu.org>
287         PR fortran/67451
288         * trans-array.c (gfc_array_allocate): Take the attributes from the
289         expression to allocate and not from the source=-expression.
291 2016-02-20  Paul Thomas  <pault@gcc.gnu.org>
293         PR fortran/69423
294         * trans-decl.c (create_function_arglist): Deferred character
295         length functions, with and without declared results, address
296         the passed reference type as '.result' and the local string
297         length as '..result'.
298         (gfc_null_and_pass_deferred_len): Helper function to null and
299         return deferred string lengths, as needed.
300         (gfc_trans_deferred_vars): Call it, thereby reducing repeated
301         code, add call for deferred arrays and reroute pointer function
302         results. Avoid using 'tmp' for anything other that a temporary
303         tree by introducing 'type_of_array' for the arrayspec type.
305 2015-02-16  Thomas Koenig  <tkoenig@gcc.gnu.org>
307         PR fortran/69742
308         * frontend-passes.c (cfe-expr_0):  Don't register functions
309         from within an ASSOCIATE statement.
311 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
313         PR fortran/60526
314         * decl.c (build_sym):  If the name has already been defined as a
315         type, it has a symtree with an upper case letter at the beginning.
316         If such a symtree exists, issue an error and exit.  Don't do
317         this if there is no corresponding upper case letter.
319 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
321         PR fortran/60526
322         PR bootstrap/69816
323         * decl.c (build_sym):  Reverted previous patch.
325 2016-02-14  Thomas Koenig  <tkoenig@gcc.gnu.org>
327         PR fortran/60526
328         * decl.c (build_sym):  If the name has already been defined as a
329         type, issue error and return false.
331 2016-02-12  David Malcolm  <dmalcolm@redhat.com>
333         PR other/69554
334         * error.c (gfc_diagnostic_start_span): New function.
335         (gfc_diagnostics_init): Initialize global_dc's start_span.
337 2016-02-11  Andre Vehreschild  <vehre@gcc.gnu.org>
339         PR fortran/69296
340         * gfortran.h: Added flag to gfc_association_list indicating that
341         the rank of an associate variable has been guessed only.
342         * parse.c (parse_associate): Set the guess flag mentioned above
343         when guessing the rank of an expression.
344         * resolve.c (resolve_assoc_var): When the rank has been guessed,
345         make sure, that the guess was correct else overwrite with the actual
346         rank.
347         * trans-stmt.c (trans_associate_var): For subref_array_pointers in
348         class objects, take the span from the _data component.
350 2016-02-07  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
352         PR fortran/50555
353         * primary.c (match_actual_arg): If symbol has attribute flavor of
354         namelist, generate an error. (gfc_match_rvalue): Likewise return
355         MATCH_ERROR.
356         * resolve.c (resolve_symbol): Scan arument list of procedures and
357         generate an error if a namelist is found.
359 2016-02-05  Mikael Morin  <mikael@gcc.gnu.org>
361         PR fortran/66089
362         * trans-expr.c (expr_is_variable, gfc_expr_is_variable): Rename
363         the former to the latter and make it non-static.  Update callers.
364         * gfortran.h (gfc_expr_is_variable): New declaration.
365         (struct gfc_ss_info): Add field needs_temporary.
366         * trans-array.c (gfc_scalar_elemental_arg_saved_as_argument):
367         Tighten the condition on aggregate expressions with a check
368         that the expression is a variable and doesn't need a temporary.
369         (gfc_conv_resolve_dependency): Add intermediary reference variable.
370         Set the needs_temporary field.
372 2016-02-03  Andre Vehreschild  <vehre@gcc.gnu.org>
374         PR fortran/67451
375         PR fortran/69418
376         * trans-expr.c (gfc_copy_class_to_class): For coarrays just the
377         pointer is passed.  Take it as is without trying to deref the
378         _data component.
379         * trans-stmt.c (gfc_trans_allocate): Take care of coarrays as
380         argument to source=-expression.
382 2016-02-02  Nathan Sidwell  <nathan@codesourcery.com>
384         * lang.opt (fopenacc-dim=): New option.
386 2016-01-31  Paul Thomas  <pault@gcc.gnu.org>
388         PR fortran/67564
389         * trans-expr.c (gfc_conv_procedure_call): For the vtable copy
390         subroutines, add a string length argument, when the actual
391         argument is an unlimited polymorphic class object.
393 2016-01-30  Paul Thomas  <pault@gcc.gnu.org>
395         PR fortran/69566
396         * trans-expr.c (gfc_conv_procedure_call): Correct expression
397         for 'ulim_copy', which was missing a test for 'comp'.
399 2016-01-28  Andre Vehreschild  <vehre@gcc.gnu.org>
401         PR fortran/62536
402         * decl.c (gfc_match_end): Only unnest and remove BLOCK namespaces
403         when the END encountered does not match a BLOCK's end.
405 2016-01-27  Janus Weil  <janus@gcc.gnu.org>
407         PR fortran/69484
408         * invoke.texi: Fix documentation of -Wall with respect to -Wtabs.
410 2016-01-27  Paul Thomas  <pault@gcc.gnu.org>
412         PR fortran/69422
413         * trans-expr.c (is_scalar_reallocatable_lhs): Remove the check
414         for allocatable components, whilst checking if the symbol is a
415         derived or class entity..
417 2016-01-26  Paul Thomas  <pault@gcc.gnu.org>
419         PR fortran/69385
420         * trans-expr.c (gfc_trans_assignment_1): Exclude initialization
421         assignments from check on assignment of scalars to unassigned
422         arrays and correct wrong code within the corresponding block.
424 2016-01-26  David Malcolm  <dmalcolm@redhat.com>
426         PR other/69006
427         * error.c (gfc_diagnostic_starter): Delete use of pp_newline.
429 2016-01-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
431         PR fortran/69397
432         PR fortran/68442
433         * interface.c (gfc_arglist_matches_symbol): Replace assert with
434         a return false if not a procedure.
435         * resolve.c (resolve_generic_f): Test if we are resolving an
436         initialization expression and adjust error message accordingly.
438 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
440         PR fortran/66094
441         * frontend-passes.c (matmul_lhs_realloc):  Add
442         forgotten break statement.
444 2016-01-24  Dominique d'Humieres <dominiq@lps.ens.fr>
446         PR fortran/68283
447         * primary.c (gfc_variable_attr): revert revision r221955,
448         call gfc_internal_error only if there is no error.
450 2016-01-24  Thomas Koenig  <tkoenig@gcc.gnu.org>
452         PR fortran/66094
453         * frontend-passes.c (enum matrix_case):  Add case A2B2T for
454         MATMUL(A,TRANSPoSE(B)) where A and B are rank 2.
455         (inline_limit_check):  Also add A2B2T.
456         (matmul_lhs_realloc):  Handle A2B2T.
457         (check_conjg_variable):  Rename to
458         (check_conjg_transpose_variable):  and also count TRANSPOSE.
459         (inline_matmul_assign):  Handle A2B2T.
461 2016-01-21  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
463         PR fortran/65996
464         * error.c (gfc_error): Save the state of abort_on_error and set
465         it to false for buffered errors to allow normal processing.
466         Restore the state before leaving.
468 2016-01-19  Martin Jambor  <mjambor@suse.cz>
470         * types.def (BT_FN_VOID_UINT_PTR_INT_PTR): New.
471         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_INT_INT): Removed.
472         (BT_FN_VOID_INT_OMPFN_SIZE_PTR_PTR_PTR_UINT_PTR_PTR): New.
474 2016-01-15  Paul Thomas  <pault@gcc.gnu.org>
476         PR fortran/64324
477         * resolve.c (check_uop_procedure): Prevent deferred length
478         characters from being trapped by assumed length error.
480         PR fortran/49630
481         PR fortran/54070
482         PR fortran/60593
483         PR fortran/60795
484         PR fortran/61147
485         PR fortran/64324
486         * trans-array.c (gfc_conv_scalarized_array_ref): Pass decl for
487         function as well as variable expressions.
488         (gfc_array_init_size): Add 'expr' as an argument. Use this to
489         correctly set the descriptor dtype for deferred characters.
490         (gfc_array_allocate): Add 'expr' to the call to
491         'gfc_array_init_size'.
492         * trans.c (gfc_build_array_ref): Expand logic for setting span
493         to include indirect references to character lengths.
494         * trans-decl.c (gfc_get_symbol_decl): Ensure that deferred
495         result char lengths that are PARM_DECLs are indirectly
496         referenced both for directly passed and by reference.
497         (create_function_arglist): If the length type is a pointer type
498         then store the length as the 'passed_length' and make the char
499         length an indirect reference to it.
500         (gfc_trans_deferred_vars): If a character length has escaped
501         being set as an indirect reference, return it via the 'passed
502         length'.
503         * trans-expr.c (gfc_conv_procedure_call): The length of
504         deferred character length results is set TREE_STATIC and set to
505         zero.
506         (gfc_trans_assignment_1): Do not fix the rse string_length if
507         it is a variable, a parameter or an indirect reference. Add the
508         code to trap assignment of scalars to unallocated arrays.
509         * trans-stmt.c (gfc_trans_allocate): Remove 'def_str_len' and
510         all references to it. Instead, replicate the code to obtain a
511         explicitly defined string length and provide a value before
512         array allocation so that the dtype is correctly set.
513         trans-types.c (gfc_get_character_type): If the character length
514         is a pointer, use the indirect reference.
516 2016-01-10  Thomas Koenig  <tkoenig@gcc.gnu.org>
518         PR fortran/69154
519         * frontend-passes.c (in_where):  New variable.
520         (inline_matmul_assign):  Don't try this if we are within
521         a WHERE statement.
522         (gfc_code_walker):  Keep track of in_where.
524 2016-01-10  Paul Thomas  <pault@gcc.gnu.org>
526         PR fortran/67779
527         * trans_array.c (gfc_conv_scalarized_array_ref): Add missing
528         se->use_offset from condition for calculation of 'base'.
530 2016-01-08  Jakub Jelinek  <jakub@redhat.com>
532         PR fortran/69128
533         * trans.h (OMPWS_SCALARIZER_BODY): Define.
534         (OMPWS_NOWAIT): Renumber.
535         * trans-stmt.c (gfc_trans_where_3): Only set OMPWS_SCALARIZER_WS
536         if OMPWS_SCALARIZER_BODY is not set already, and set also
537         OMPWS_SCALARIZER_BODY until the final loop creation.
538         * trans-expr.c (gfc_trans_assignment_1): Likewise.
539         * trans-openmp.c (gfc_trans_omp_workshare): Also clear
540         OMPWS_SCALARIZER_BODY.
541         * trans-array.c (gfc_trans_scalarized_loop_end): Don't create
542         OMP_FOR if OMPWS_SCALARIZER_BODY is set.
544 2016-01-04  Jakub Jelinek  <jakub@redhat.com>
546         Update copyright years.
548         * gfortranspec.c (lang_specific_driver): Update copyright notice
549         dates.
550         * gfc-internals.texi: Bump @copying's copyright year.
551         * gfortran.texi: Ditto.
552         * intrinsic.texi: Ditto.
553         * invoke.texi: Ditto.
555 2016-01-01  Paul Thomas  <pault@gcc.gnu.org>
557         PR fortran/68864
558         * trans-array.c (evaluate_bound): If deferred, test that 'desc'
559         is an array descriptor before using gfc_conv_descriptor_xxx.
561 Copyright (C) 2016 Free Software Foundation, Inc.
563 Copying and distribution of this file, with or without modification,
564 are permitted in any medium without royalty provided the copyright
565 notice and this notice are preserved.