OSDN Git Service

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