OSDN Git Service

33ebbf65ab2140f487b5bb0d2172af20f7bc6bb2
[pf3gnuchains/gcc-fork.git] / gcc / fortran / ChangeLog
1 2007-01-30  Steve Ellcey  <sje@cup.hp.com>
2
3         PR fortran/30432
4         * trans-types.c (gfc_get_function_type):  Do not add void_type_node
5         to empty arg list.
6         * trans-decl.c (create_function_arglist): Change assert.
7
8 2007-01-29  Paul Thomas  <pault@gcc.gnu.org>
9
10         PR fortran/30554
11         * module.c (read_module): If a symbol is excluded by an ONLY
12         clause, check to see if there is a symtree already loaded. If
13         so, attach the symtree to the pointer_info.
14
15 2007-01-28  Thomas Koenig  <Thomas.Koenig@online.de>
16
17         PR libfortran/30389
18         * gfortran.h:  Remove gfc_simplify_init_1.
19         * arith.h:  Remove third argument from gfc_compare_string.
20         * arith.c(gfc_compare_expression):  Remove third argument
21         from call to gfc_compare_string.
22         (gfc_compare_string):  Remove third argument xcoll_table.
23         Remove use of xcoll_table.
24         * misc.c(gfc_init_1):  Remove call to gfc_simplify_init_1.
25         * simplify.c(ascii_table):  Remove.
26         (xascii_table): Likewise.
27         (gfc_simplify_achar):  ICE if extract_int fails.  Remove use of
28         ascii_table.  Warn if -Wsurprising and value < 0 or > 127.
29         (gfc_simplify_char):  ICE if extract_int fails. Error if
30         value < 0 or value > 255.
31         (gfc_simplify_iachar):  Remove use of xascii_table.
32         Char values outside of 0..255 are an ICE.
33         (gfc_simplify_lge):  Remove use of xascii_table.
34         (gfc_simplify_lgt):  Likewise.
35         (gfc_simplify_lle):  Likewise.
36         (gfc_simplify_llt):  Likewise.
37         (invert_table):  Remove.
38         (gfc_simplify_init_1):  Remove.
39
40 2007-01-27  Roger Sayle  <roger@eyesopen.com>
41
42         * trans-stmt.c (forall_info): Replace the next_nest and outer
43         fields that previously implemented a doubly-linked list with a
44         single prev_nest field (singly-linked list).
45         (gfc_trans_nested_forall_loop): The nested_forall_info argument
46         now denotes the innermost FORALL in the loop nest.
47         (compute_overall_iter_number): Use prev_nest instead of next_nest.
48         (gfc_trans_forall_1): Link/cons the new "info" to the head of the
49         nested_forall_info linked list.  Free the current "info" when done.
50
51 2007-01-27  Paul Thomas  <pault@gcc.gnu.org>
52
53         PR fortran/30407
54         * trans-expr.c (gfc_conv_operator_assign): New function.
55         * trans.h : Add prototype for gfc_conv_operator_assign.
56         * trans-stmt.c (gfc_trans_where_assign): Add a gfc_symbol for
57         a potential operator assignment subroutine.  If it is non-NULL
58         call gfc_conv_operator_assign instead of the first assignment.
59         ( gfc_trans_where_2): In the case of an operator assignment,
60         extract the argument expressions from the code for the
61         subroutine call and pass the symbol to gfc_trans_where_assign.
62         resolve.c (resolve_where, gfc_resolve_where_code_in_forall,
63         gfc_resolve_forall_body): Resolve the subroutine call for
64         operator assignments.
65
66 2007-01-26  Steven Bosscher  <stevenb.gcc@gmail.com>
67             Steven G. Kargl <kargl@gcc.gnu.org>
68
69         PR fortran/30278
70         * fortran/io.c (next_char): Deal with backslash escaped characters.
71         Issue warnings in non -std=gnu cases.
72         * fortran/primary.c (next_string_char): Issue warnings in non
73
74 2007-01-26  Tobias Burnus  <burnus@net-b.de>
75
76         * lang-specs.h: Add support for .f03 and .F03 extensions.
77         * gfortran.texi: Document .f03 extension.
78         * options.c (form_from_filename): Recognize .f03.
79
80 2007-01-25  Manuel Lopez-Ibanez  <manu@gcc.gnu.org>
81
82         PR fortran/30437
83         * lang.opt (Wall): Remove RejectNegative.
84         * options.c (gfc_handle_option): Wall can be disabled.
85         (set_Wall): Add a parameter for disabling Wall.
86         
87 2007-01-23  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
88
89         PR fortran/30532
90         * scanner.c (load_line): Remove check fot ctrl-z and don't gobble.
91         
92 2007-01-23  Paul Thomas  <pault@gcc.gnu.org>
93
94         PR fortran/30481
95         * match.c (gfc_match_namelist): Add check for assumed size character
96         in namelist and provide error if found.
97
98 2007-01-21  Brooks Moses  <brooks.moses@codesourcery.com>
99
100         * intrinsic.texi (ACHAR): Added cross-references.
101         (CHAR): Put cross-references in alphabetical order.
102         (IACHAR): Added cross-references.
103         (ICHAR): Added cross-references.
104
105 2007-01-20  Brooks Moses  <brooks.moses@codesourcery.com>
106
107         * intrinsic.texi: Edited all "Syntax" examples to a consistent form.
108         (MAXVAL): Corrected description of result characteristics.
109         (MINVAL): Same.
110         (UMASK): Added documentation.
111
112 2007-01-20  Steven G. Kargl  <kargl@gcc.gnu.org>
113
114         * openmp.c, matchexp.c, module.c, scanner.c, resolve.c, st.c,
115         parse.c, primary.c, options.c, misc.c, simplify.c:  Next installment
116         in the massive whitespace patch.
117
118 2007-01-20  Roger Sayle  <roger@eyesopen.com>
119
120         * module.c (mio_array_ref): The dimen_type fields of an array ref
121         are an enumerated type and can't be read/written directly with a
122         call to mio_integer.  Instead loop over and cast each element.
123
124 2007-01-20  Roger Sayle  <roger@eyesopen.com>
125
126         * dependency.c (gfc_full_array_ref_p): Check that ref->next is NULL,
127         i.e. that the ARRAY_REF doesn't mention components.
128         * trans-array.c (gfc_constant_array_constructor_p): Export external
129         function renamed from constant_array_constructor_p.
130         (gfc_build_constant_array_constructor): Export.
131         (gfc_trans_array_constructor): Update call to the renamed function
132         constant_array_constructor_p.
133         * trans-array.h (gfc_constant_array_constructor_p): Prototype here.
134         (gfc_build_constant_array_constructor): Likewise.
135         * trans-expr.c (gfc_build_memcpy_call): New helper function split
136         out from gfc_trans_array_copy.
137         (gfc_trans_array_copy): Use gfc_build_memcpy_call.
138         (gfc_trans_array_constructor_copy): New function to optimize
139         assigning an entire array from a constant array constructor.
140         (gfc_trans_assignment): Call gfc_trans_array_constructor_copy
141         when appropriate.
142
143 2007-01-20  Roger Sayle  <roger@eyesopen.com>
144
145         * trans-intrinsic.c (gfc_conv_intrinsic_sign): New branchless
146         implementation for the SIGN intrinsic with integral operands.
147         (gfc_conv_intrinsic_minmax): Fix whitespace.
148
149 2007-01-20  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
150
151         * gfortran.h (gfc_options_t): Add flag_allow_leading_underscore.
152         * lang.opt: Add -fallow-leading-underscore.
153         * match.c (gfc_match_name): Allow leading underscore in symbol
154         name if -fallow-leading-underscore is used.
155         * symbol.c (gfc_get_default_type): Add special case for symbol
156         names beginning with an underscore.
157         * trans-decl.c (gfc_get_extern_function_decl,
158         gfc_build_intrinsic_function_decls): Add _gfortran prefix to
159         library symbols selected_int_kind, selected_real_kind and 
160         all specifics.
161         * options.c (gfc_init_options, gfc_handle_option): Handle the
162         new -fallow-leading-underscore option.
163
164 2007-01-20  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
165
166         PR fortran/30446
167         * options.c (gfc_handle_module_path_options): Path used in -J
168         option is now added to the module search path.
169
170 2007-01-20  Richard Guenther  <rguenther@suse.de>
171
172         PR fortran/30223
173         * f95-lang.c (gfc_init_builtin_functions): Provide cbrt and
174         cexpi builtins if we have TARGET_C99_FUNCTIONS.  Provide
175         sincos builtins if the target has sincos.
176
177 2007-01-19  Brooks Moses  <brooks.moses@codesourcery.com>
178
179         * intrinsic.texi (MATMUL): Corrected a typo.
180         (MAX): Separated @var arguments.
181         (MIN): Separated @var arguments.
182
183 2007-01-19  Brooks Moses  <brooks.moses@codesourcery.com>
184
185         * intrinsic.texi: general whitespace cleanup.
186         (menu): Added TIME8, removed UNMASK.
187         (AINT): Clarified argument requirement.
188         (ANINT): Clarified argument requirement.
189         (CEILING): Clarified argument requirement.
190         (CHAR): Clarified argument requirement.
191         (CMPLX): Clarified argument requirement.
192         (DCMPLX): Clarified argument requirement.
193         (FGET): Line rewrapping.
194         (FLOOR): Clarified argument requirement.
195         (GMTIME): Added documentation.
196         (IAND): Added cross-reference.
197         (IBCLR): Added cross-reference.
198         (IBSET): Added cross-reference.
199         (IEOR): Added cross-reference.
200         (INT): Collapsed examples, clarified argument requirement.
201         (IOR): Added cross-references.
202         (LEN_TRIM): Corrected result kind.
203         (LINK): Added cross-reference.
204         (LLT): Removed "documentation pending".
205         (LOGICAL): Added documentation.
206         (LSHIFT): Added documentation.
207         (LTIME): Added documentation.
208         (MATMUL): Added documentation.
209         (MAX): Added documentation.
210         (MAXLOC): Added documentation.
211         (MAXVAL): Added documentation.
212         (MERGE): Added documentation.
213         (MIN): Added documentation.
214         (MINLOC): Added documentation.
215         (MINVAL): Added documentation.
216         (MVBITS): Moved to correct place, added documentation.
217         (NOT): Added documentation.
218         (PERROR): Added documentation.
219         (RAN): Moved to correct place, added documentation.
220         (REAL): Clarified argument requirement.
221         (RENAME): Added documentation.
222         (RSHIFT): Clarified argument requirement.
223         (SIGN): Corrected table specification.
224         (SYMLNK): Added documentation.
225         (SYSTEM): Added documentation.
226         (TIME): Added documentation.
227         (TIME8): Added section and documentation.
228         (UNMASK): Removed erroneous section.
229
230 2007-01-18  H.J. Lu  <hongjiu.lu@intel.com>
231
232         * trans-stmt.c (compute_overall_iter_number): Fix a typo.
233
234 2007-01-18  Roger Sayle  <roger@eyesopen.com>
235
236         * trans-expr.c (copyable_array_p): Consider user derived types without
237         allocatable components to be copyable.
238
239 2007-01-18  Roger Sayle  <roger@eyesopen.com>
240
241         * trans-stmt.c (compute_overall_iter_number): Enhance to precompute
242         the number of interations in unconditional FORALL nests with constant
243         bounds.
244
245 2007-01-18  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
246             Tobias Burnus  <burnus@net-b.de>
247
248         PR libfortran/29649
249         * gfortran.h (gfc_option_t): Add flag_dump_core.
250         * lang.opt: Add -fdump-core option.
251         * invoke.texi: Document the new options.
252         * trans-decl.c (gfc_build_builtin_function_decls): Add new
253           options to the call to set_std.
254         * options.c (gfc_init_options, gfc_handle_option): Set the
255           new options.
256
257 2007-01-17  Paul Thomas  <pault@gcc.gnu.org>
258
259         PR fortran/30476
260         * module.c (load_generic_interfaces): Make the marking of the
261         symbol as ambiguous conditional on the module names being
262         different.
263         (write_generic): Ensure that the generic interface has a
264         non-NULL module field.
265
266 2007-01-16  Roger Sayle  <roger@eyesopen.com>
267
268         PR fortran/30404
269         * trans-stmt.c (forall_info): Remove pmask field.
270         (gfc_trans_forall_loop): Remove NVAR argument, instead assume that
271         NVAR covers all the interation variables in the current forall_info.
272         Add an extra OUTER parameter, which specified the loop header in
273         which to place mask index initializations.
274         (gfc_trans_nested_forall_loop): Remove NEST_FLAG argument.
275         Change the semantics of MASK_FLAG to only control the mask in the
276         innermost loop.
277         (compute_overall_iter_number): Optimize the trivial case of a
278         top-level loop having a constant number of iterations.  Update
279         call to gfc_trans_nested_forall_loop.  Calculate the number of
280         times the inner loop will be executed, not to size of the 
281         iteration space.
282         (allocate_temp_for_forall_nest_1): Reuse SIZE as BYTESIZE when
283         sizeof(type) == 1.  Tidy up.
284         (gfc_trans_assign_need_temp): Remove NEST_FLAG argument from calls
285         to gfc_trans_nested_forall_loop.
286         (gfc_trans_pointer_assign_need_temp): Likewise.
287         (gfc_trans_forall_1): Remove unused BYTESIZE, TMPVAR, SIZEVAR and
288         LENVAR local variables.  Split mask allocation into a separate
289         hunk/pass from mask population.  Use allocate_temp_for_forall_nest
290         to allocate the FORALL mask with the correct size.  Update calls
291         to gfc_trans_nested_forall_loop.
292         (gfc_evaluate_where_mask): Update call to
293         gfc_trans_nested_forall_loop.
294         (gfc_trans_where_2): Likewise.
295
296 2007-01-15  Paul Thomas  <pault@gcc.gnu.org>
297
298         PR fortran/28172
299         * trans-stmt.c (gfc_trans_call): If it does not have one, get
300         a backend_decl for an alternate return.
301
302         PR fortran/29389
303         * resolve.c (pure_function): Statement functions are pure. Note
304         that this will have to recurse to comply fully with F95.
305
306         PR fortran/29712
307         * resolve.c (resolve_function): Only a reference to the final
308         dimension of an assumed size array is an error in an inquiry
309         function.
310
311         PR fortran/30283
312         * resolve.c (resolve_function): Make sure that the function
313         expression has a type.
314
315 2007-01-14  Paul Thomas  <pault@gcc.gnu.org>
316
317         PR fortran/30410
318         * trans-decl.c (gfc_sym_mangled_function_id): Module, external
319         symbols must not have the module name prepended.
320
321 2007-01-11  Thomas Koenig  <Thomas.Koenig@online.de>
322
323         PR libfortran/30415
324         * iresolve.c (gfc_resolve_maxloc):  If the rank
325         of the return array is nonzero and we process an
326         integer array smaller than default kind, coerce
327         the array to default integer.
328         * iresolve.c (gfc_resolve_minloc):  Likewise.
329
330 2007-01-11  Brooks Moses  <brooks.moses@codesourcery.com>
331
332         * simplify.c: Update copyright to 2007.
333         * scanner.c: Same.
334
335 2007-01-11  Francois-Xavier Coudert  <coudert@clipper.ens.fr>
336
337         PR fortran/30430
338         * scanner.c (gfc_release_include_path): Free gfc_option.module_dir
339         only once!
340
341 2007-01-09  Brooks Moses  <brooks.moses@codesourcery.com>
342
343         * simplify.c (gfc_simplify_ibclr): Fix POS comparison.
344         (gfc_simplify_ibset): Same.
345
346 2007-01-09  Brooks Moses  <brooks.moses@codesourcery.com>
347
348         PR 30381
349         PR 30420
350         * simplify.c (convert_mpz_to_unsigned): New function.
351         (convert_mpz_to_signed): New function, largely based on
352         twos_complement().
353         (twos_complement): Removed.
354         (gfc_simplify_ibclr): Add conversions to and from an
355         unsigned representation before bit-twiddling.
356         (gfc_simplify_ibset): Same.
357         (gfc_simplify_ishftc): Add checks for overly large
358         constant arguments, only check the third argument if
359         it's present, carry over high bits into the result as
360         appropriate, and perform the final conversion back to
361         a signed representation using the correct sign bit.
362         (gfc_simplify_not): Removed unnecessary masking.
363
364 2007-01-09  Paul Thomas  <pault@gcc.gnu.org>
365
366         PR fortran/30408
367         * resolve.c (resolve_code): Use the code->expr character length
368         directly to set length of llen.
369
370 2007-01-09  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
371
372         PR fortran/30408
373         * lang.opt: Add Wcharacter_truncation option.
374         * options.c (gfc_init_options): Initialize
375         gfc_option.warn_character_truncation to zero.
376         (gfc_handle_option): Add case for OPT_Wcharacter_truncation.
377
378 2007-01-08  Steven G. Kargl  <kargl@gcc.gnu.org>
379
380         * interface.c, intrinsic.c, gfortranspec.c, io.c, f95-lang.c,
381         iresolve.c, match.c:  Update Copyright years.  Whitespace.
382
383 2007-01-08  Richard Guenther  <rguenther@suse.de>
384
385         * trans-io.c (transfer_array_desc): Use build_int_cst instead
386         of build_int_cstu.
387
388 2007-01-08  Roger Sayle  <roger@eyesopen.com>
389
390         * trans-array.c (constant_array_constructor_p): New function to
391         determine whether an array constructor consists only of constant
392         elements, and if so return it's size.
393         (gfc_build_constant_array_constructor): Construct a statically
394         initialized gfortran array for a given EXPR_ARRAY.
395         (gfc_trans_constant_array_constructor): Efficiently scalarize
396         a constant array constructor.
397         (gfc_trans_array_constructor):  Tidy up use of CONST_STRING.
398         Special case scalarization of constant array constructors, all of
399         whose elements are specified, using constant_array_constructor_p 
400         and gfc_trans_constant_array_constructor.
401         (gfc_conv_scalarized_array_ref): Check whetger info->offset is zero
402         before adding it to index, to avoid creating a NON_LVALUE_EXPR.
403
404 2007-01-08  Kazu Hirata  <kazu@codesourcery.com>
405
406         gfortran.texi: Fix typos.
407
408 2007-01-07  Steven G. Kargl  <kargl@gcc.gnu.org>
409
410         * decl.c, dump-parse-tree.c, error.c, data.c, expr.c, dependency.c,
411         convert.c:  Update Copyright dates.  Fix whitespace.
412
413 2007-01-07  Bernhard Fischer  <aldot@gcc.gnu.org>
414
415         * data.c (gfc_assign_data_value): Fix whitespace.
416
417 2007-01-07  Bernhard Fischer  <aldot@gcc.gnu.org>
418
419         * trans-array.c (gfc_trans_create_temp_array, gfc_array_init_size):
420         Commentary typo fix.
421
422 2007-01-07  Bernhard Fischer  <aldot@gcc.gnu.org>
423
424         PR fortran/27698
425         * match.c (gfc_match_name): Print diagnostics for invalid
426         character in names.
427
428 2007-01-06  Steven G. Kargl  <kargl@gcc.gnu.org>
429
430         * array.c: Fix whitespace in comment table.
431
432 2007-01-06  Steven G. Kargl  <kargl@gcc.gnu.org>
433
434         * array.c, bbt.c, check.c:  Update copyright years.  Whitespace.
435
436 2007-01-06  Steven G. Kargl  <kargl@gcc.gnu.org>
437
438         * arith.c: Update copyright years.  Whitespace.
439
440 2007-01-05  Roger Sayle  <roger@eyesopen.com>
441
442         * trans-expr.c (gfc_trans_assignment_1): New subroutine to scalarize
443         array assignments split out from gfc_trans_assignment.
444         (gfc_trans_array_copy): New function to implement array to array
445         copies via calls to __builtin_memcpy.
446         (copyable_array_p): New helper function to identify an array of
447         simple/POD types, that may be copied/assigned using memcpy.
448         (gfc_trans_assignment): Use gfc_trans_array_copy to handle simple
449         whole array assignments considered suitable by copyable_array_p.
450         Invoke gfc_trans_assignment_1 to perform the fallback scalarization.
451
452 2007-01-05  Roger Sayle  <roger@eyesopen.com>
453
454         * trans-array.c (gfc_trans_array_constructor_value): Make the
455         static const "data" array as TREE_READONLY.
456         * trans-stmt.c (gfc_trans_character_select): Likewise.
457
458 2007-01-05  Roger Sayle  <roger@eyesopen.com>
459
460         * trans-array.c (gfc_conv_loop_setup):  Test whether the loop
461         stride is one, to avoid fold_build2 introducing a useless
462         NON_LVALUE_EXPR node.
463
464 2007-01-05  Tobias Burnus  <burnus@net-b.de>
465
466         * symbol.c (check_conflict): Fix error message.
467
468 2007-01-05  Paul Thomas  <pault@gcc.gnu.org>
469
470         PR fortran/23232
471         * decl.c (gfc_in_match_data, gfc_set_in_match_data): New
472         functions to signal that a DATA statement is being matched.
473         (gfc_match_data): Call gfc_set_in_match_data on entry and on
474         exit.
475         * gfortran.h : Add prototypes for above.
476         * expr.c (check_init_expr): Avoid check on parameter or
477         variable if gfc_in_match_data is true.
478         (gfc_match_init_expr): Do not call error on non-reduction of
479         expression if gfc_in_match_data is true.
480
481         PR fortran/27996
482         PR fortran/27998
483         * decl.c (gfc_set_constant_character_len): Add boolean arg to
484         flag array constructor resolution.  Warn if string is being
485         truncated.  Standard dependent error if string is padded. Set
486         new arg to false for all three calls to
487         gfc_set_constant_character_len.
488         * match.h : Add boolean arg to prototype for
489         gfc_set_constant_character_len.
490         * gfortran.h : Add warn_character_truncation to gfc_options.
491         * options.c (set_Wall): Set warn_character_truncation if -Wall
492         is set.
493         * resolve.c (resolve_code): Warn if rhs string in character
494         assignment has to be truncated.
495         * array.c (gfc_resolve_character_array_constructor): Set new
496         argument to true for call to gfc_set_constant_character_len.
497
498 2007-01-05  Tobias Burnus  <burnus@net-b.de>
499
500         PR fortran/29624
501         * interface.c (compare_parameter_intent): New function.
502           (check_intents): Support pointer intents.
503         * symbol.c (check_conflict): Support pointer intents,
504           better conflict_std message.
505         * expr.c (gfc_check_assign,gfc_check_pointer_assign):
506           Support pointer intents.
507         * resolve.c (resolve_deallocate_expr,resolve_allocate_expr):
508           Support pointer intents.
509
510 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
511
512         PR 30371
513         * check.c (gfc_check_kill_sub): Add checks for non-scalar
514         arguments.
515
516 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
517
518         * intrinsic.texi: Minor cleanup, reflowing overlong
519         paragraphs, and correcting whitespace.
520
521 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
522
523         * intrinsic.texi (LBOUND): Add documentation.
524         (LGE): Add documentation.
525         (LGT): Add documentation.
526         (LINK): Add documentation.
527         (LLE): Add documentation.
528         (LLT): Add documentation.
529         (LNBLNK): Add documentation.
530         (UBOUND): Add documentation.
531         (UNLINK): Add documentation.
532
533 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
534
535         * intrinsic.texi (IAND): Clarify argument specifications.
536         (IBCLR): Add documentation.
537         (IBITS): Add documentation.
538         (IBSET): Add documentation.
539         (IEOR): Add documentation.
540         (IERRNO): Add documentation.
541         (INDEX): Add documentation.
542         (IOR): Add documentation.
543         (ISHFT): Add documentation.
544         (ISHFTC): Add documentation.
545         (KILL): Add documentation.
546         (LEN_TRIM): Add documentation.
547
548 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
549
550         PR 30235
551         * interface.c (compare_actual_formal): check for
552         alternate returns when iterating over non-present
553         arguments.
554
555 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
556
557         * invoke.texi: Update manpage copyright to include 2007.
558
559 2007-01-04  Brooks Moses  <brooks.moses@codesourcery.com>
560
561         * gfortran.texi: Update copyright to include 2007.
562         * intrinsic.texi: Update copyright to include 2007.
563         * invoke.texi: Update copyright to include 2007.
564
565 2007-01-02  Tobias Burnus  <burnus@net-b.de>
566             Jakub Jelinek  <jakub@redhat.com>
567
568         PR fortran/30276
569         * scanner.c (open_included_file): Revert patch.
570           (gfc_open_included_file): Support absolute pathnames.
571           (gfc_open_intrinsic_module): Support absolute pathnames.
572
573 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
574
575         * gfortran.texi (GNU Fortran and GCC): Rewrite
576
577 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
578
579         * gfortran.texi (Introduction): Lower "Part I:
580         Introduction" to a chapter, renumber Parts II and III to
581         Parts I and II.
582         * intrinsic.texi (Introduction): Rename to "Introduction
583         to Intrinsics" to avoid conflict with the new chapter.
584
585 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
586
587         * intrinsic.texi (Introduction): Rewrite first paragraph.
588
589 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
590
591         * invoke.texi (OpenMP): Added index entry.
592         * gfortran.texi (title page): Removed erroneous '*'.
593
594 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
595
596         * gfortran.texi (GFORTRAN_DEFAULT_RECL): Added units
597         to description.
598         (Extensions): Miscellaneous minor rewriting and copyediting.
599         (BOZ-literal constants): Renamed from Hexadecimal constants.
600         (Hollerith constants support): Added explanation and 
601         suggestions for standard-conforming modern equivalents.
602
603 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
604
605         * intrinsic.texi: Improvements to index entries; change
606         @findex entries to @cindex entries.
607         * invoke.texi: Standardize and improve index entries.
608         * gfortran.texi: Fix @code in one index entry.
609
610 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
611
612         * invoke.texi: Change @code-type macros to appropriate
613         variants (@command, @option, etc.)
614         * gfortran.texi: Same.
615
616 2007-01-03  Brooks Moses  <brooks.moses@codesourcery.com>
617
618         * intrinsic.texi: Various minor cleanups.
619
620 2007-01-02  Steven G. Kargl  <kargls@comcast.net>
621
622         * trans-intrinsic.c (gfc_conv_intrinsic_ibits): Fix call to
623         build_int_cst.
624
625 2007-01-02  Tobias Burnus  <burnus@net-b.de>
626
627         PR fortran/30276
628         * scanner.c (open_included_file): Support full-path filenames.
629
630 2007-01-02  Paul Thomas  <pault@gcc.gnu.org>
631
632         PR fortran/20896
633         * interface.c (check_sym_interfaces): Remove call to
634         resolve_global_procedure.
635         gfortran.h : Remove prototype for resolve_global_procedure.
636         resolve.c (resolve_global_procedure): Add static attribute
637         to function declaration.
638
639 2007-01-01  Steven G. Kargl  <kargls@comcast.net>
640
641         * ChangeLog: Copy to ...
642         * ChangeLog-2006: here.