[Ada] Build full derivation for private concurrent type
[official-gcc.git] / gcc / ada / ChangeLog
blobc0c6c53140dd425dd32737d3a9b0051adb5d63d3
1 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
3         * sem_ch3.adb (Build_Derived_Concurrent_Type): Add a couple of
4         local variables and use them.  When the derived type fully
5         constrains the parent type, rewrite it as a subtype of an
6         implicit (unconstrained) derived type instead of the other way
7         around.
8         (Copy_And_Build): Deal with concurrent types and use predicates.
9         (Build_Derived_Private_Type): Build the full derivation if
10         needed for concurrent types too.
11         (Build_Derived_Record_Type): Add marker comment.
12         (Complete_Private_Subtype): Use predicates.
14 2019-08-13  Ed Schonberg  <schonberg@adacore.com>
16         * sem_ch3.adb (Check_Generic_Ancestor): New subprogram,
17         aubsidiary to Build_Derived_Record_Type. to enforce the rule
18         that a type extension declared in a generic body cznnot have an
19         ancestor that is a generic formal (RM 3.9.1 (4/2)). The rule
20         applies to all ancestors of the type, including interface
21         progenitors.
23 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
25         * sem_ch3.adb (Build_Underlying_Full_View): Delete.
26         (Complete_Private_Subtype): Do not set the full view on the
27         private subtype here.  If the full base is itself derived from
28         private, do not re-derive the parent type but instead constrain
29         an existing underlying full view.
30         (Prepare_Private_Subtype_Completion): Do not get to the
31         underlying full view, if any.  Set the full view on the private
32         subtype here.
33         (Process_Full_View): Likewise.
34         * sem_ch12.adb (Check_Generic_Actuals): Also set
35         Is_Generic_Actual_Type on the full view if the type of the
36         actual is private.
37         (Restore_Private_Views): Also reset Is_Generic_Actual_Type on
38         the full view if the type of the actual is private.
39         * sem_eval.adb (Subtypes_Statically_Match): Remove bypass for
40         generic actual types.
42 2019-08-13  Javier Miranda  <miranda@adacore.com>
44         * sem_res.adb (Resolve_Selected_Component): When the type of the
45         component is an access to a class-wide type and the type of the
46         context is an access to a tagged type the relevant type is that
47         of the component (since in such case we may need to generate
48         implicit type conversions or dispatching calls).
50 2019-08-13  Ed Schonberg  <schonberg@adacore.com>
52         * exp_aggr.adb (Aggr_Assignment_OK_For_Backend):  Preanalyze
53         expression, rather do a full analysis, to prevent unwanted
54         removal of side effects which mask the intent of the expression.
56 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
58         * impunit.adb (Non_Imp_File_Names_95): Add
59         GNAT.Branch_Prediction.
61 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
63         * exp_ch6.adb: Remove with and use clauses for Sem_Ch12.
64         (Expand_Call_Helper): Swap the back-end inlining case and the
65         special front-end expansion case.  In back-end inlining mode, do
66         not invoke Add_Inlined_Body unless the call may be inlined.
67         * inline.ads (Add_Pending_Instantiation): New function moved
68         from...
69         * inline.adb (Add_Inlined_Body): Simplify comment.  Turn test on
70         the enclosing unit into assertion.
71         (Add_Pending_Instantiation): New function moved from...
72         * sem_ch12.ads (Add_Pending_Instantiation): ...here.
73         * sem_ch12.adb (Add_Pending_Instantiation): ...here.
75 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
77         * sem.adb (Do_Analyze): Recompute Style_Check_Max_Line_Length
78         after restoring Style_Max_Line_Length.
80 2019-08-13  Arnaud Charlet  <charlet@adacore.com>
82         * sem_ch13.adb (Check_Iterator_Functions): Protect against
83         cascaded errors.
85 2019-08-13  Ed Schonberg  <schonberg@adacore.com>
87         * sem_ch8.adb (Analyze_Subprogram_Renaming): Do no suppress mode
88         conformance checks on child unit instance that is a compilation
89         unit.
91 2019-08-13  Gary Dismukes  <dismukes@adacore.com>
93         * exp_dbug.adb (Fully_Qualify_Name): Add full name qualification
94         for the E_Exception case.
96 2019-08-13  Gary Dismukes  <dismukes@adacore.com>
98         * exp_aggr.adb (Aggr_Size_OK): Compute the aggregate size using
99         universal arithmetic, to avoid situations where the size
100         computation overflows.
102 2019-08-13  Justin Squirek  <squirek@adacore.com>
104         * repinfo.adb (List_Scalar_Storage_Order): Modify conditionals
105         for displaying ordering to always be triggered when -gnatR4 is
106         in effect.
108 2019-08-13  Justin Squirek  <squirek@adacore.com>
110         * aspects.adb, aspects.ads: Register new aspect.
111         * par-prag.adb (Prag): Register new pragma
112         * sem_ch13.adb (Analyze_Aspect_Specifications): Add processing
113         for new aspect similar to Aspect_Max_Entry_Queue_Length.
114         * sem_prag.adb, sem_prag.ads (Analyze_Pragma): Register new
115         pragma and set it to use the same processing as
116         Pragma_Max_Queue_Length.
117         * snames.ads-tmpl: Move definition of
118         Name_Max_Entry_Queue_Length so that it can be processed as a
119         pragma in addition to a restriction and add an entry for the
120         pragma itself.
122 2019-08-13  Yannick Moy  <moy@adacore.com>
124         * sem_ch4.adb (Analyze_Allocator): Do not insert subtype
125         declaration for allocator inside a spec expression.
127 2019-08-13  Yannick Moy  <moy@adacore.com>
129         * sem_res.adb (Resolve_Call): Do not inline calls inside record
130         types.
132 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
134         * sem_ch4.adb (Analyze_One_Call): Remove bypass for type
135         mismatch in nested instantiations.
136         * sem_ch8.adb (Find_Nearer_Entity): New function.
137         (Find_Renamed_Entity): Use it to disambiguate the candidates for
138         the renaming generated for an instantiation when it is
139         ambiguous.
141 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
143         * gnat1drv.adb (Adjust_Global_Switches): Do not set
144         Back_End_Inlining in ASIS mode either.
146 2019-08-13  Olivier Hainque  <hainque@adacore.com>
148         * libgnat/s-win32.ads: Define size_t and fix the MapViewOfFile
149         binding to use it instead of DWORD for the dwNumberOfBytesToMap
150         argument.
151         * libgnat/g-sercom__mingw.adb (Read): State which definition of
152         size_t to fetch in call to Last_Index.
154 2019-08-13  Arnaud Charlet  <charlet@adacore.com>
156         * gcc-interface/Make-lang.in: Remove unused TRACE variable. Pass
157         LN_S to relevant gnatlib targets.
158         * gcc-interface/Makefile.in: Systematically pass LN_S to
159         relevant gnatlib targets.
161 2019-08-13  Yannick Moy  <moy@adacore.com>
163         * sem_dim.adb (Analyze_Dimension,
164         Analyze_Dimension_Array_Aggregate, Analyze_Dimension_Call,
165         Analyze_Dimension_Extension_Or_Record_Aggregate): Return
166         immediately when inside an inlined body.
167         * sem_res.adb (Resolve_Call): Remove special checking now done
168         inside Analyze_Dimension_Call.
170 2019-08-13  Justin Squirek  <squirek@adacore.com>
172         * exp_ch4.adb (Expand_N_Allocator): Add condition to detect
173         library-level object declarations
175 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
177         * doc/gnat_ugn/building_executable_programs_with_gnat.rst
178         (-gnateT): Document Double_Float_Alignment parameter and fix
179         description of Double_Scalar_Alignment parameter.
180         * gnat_ugn.texi: Regenerate.
182 2019-08-13  Eric Botcazou  <ebotcazou@adacore.com>
184         * exp_ch6.adb (Expand_Call_Helper): If back-end inlining is
185         enabled, also instantiate the body of a generic unit containing
186         a subprogram subject to aspect/pragma Inline_Always at
187         optimization level zero.
188         * sem_ch12.adb (Might_Inline_Subp): Minor tweak.
189         (Analyze_Package_Instantiation): Do not instantiate the package
190         body because of inlining considerations if the instantiation is
191         done in a generic unit.  Move around similar condition involving
192         the main unit.  Add test on Back_End_Inlining to processing for
193         front-end inlining.
195 2019-08-13  Javier Miranda  <miranda@adacore.com>
197         * exp_disp.adb (Make_Secondary_DT): Handle record type
198         derivations that have interface components located at fixed
199         positions and interface components located at variable offset.
200         The offset of components located at fixed positions is computed
201         using the dummy object (similar to the case where all the
202         interface components are located at fixed positions).
203         (Make_DT): Build the dummy object for all tagged types that
204         implement interface types (that is, build it also for types with
205         variable size components), and use the dummy object to compute
206         the offset of all tag components located at fixed positions when
207         initializing the Interface_Table object.
209 2019-08-13  Justin Squirek  <squirek@adacore.com>
211         * gnatcmd.adb (GNATCmd): Add constant for new compiler switch
212         --help-ada, and include usage subprogram. Add line to usage help
213         explaining the new flag.
214         (GNATCmd_Usage): Rename from locally declared Usage so as not to
215         confuse with the newly imported version. Add new argument case
216         for --help-ada and add bug report email to implicit display of
217         help without the --help flag so as to unify output between the
218         two cases.
220 2019-08-13  Dmitriy Anisimkov  <anisimko@adacore.com>
222         * libgnat/g-comlin.adb (Getopt): Quote unrecognized switch in
223         Invalid_Switch exception message.
225 2019-08-13  Yannick Moy  <moy@adacore.com>
227         * sem_util.adb (Traverse_More_Func): Take into account
228         Loop_Actions inside N_Iterated_Component_Association nodes.
229         * sinfo.ads: Document correctly Loop_Actions as a field of nodes
230         of kind N_Iterated_Component_Association.
232 2019-08-13  Claire Dross  <dross@adacore.com>
234         * libgnat/a-cfinve.adb, libgnat/a-cofove.adb (Find_Index,
235         Reverse_Find_Index): Use bigger type to avoid range check
236         failure at the last loop iteration.
238 2019-08-12  Dmitriy Anisimkov  <anisimko@adacore.com>
240         * libgnat/g-socket.adb (Is_IPv6_Address): Check that no less
241         then 2 colons in IPv6 numeric address.
243 2019-08-12  Dmitriy Anisimkov  <anisimko@adacore.com>
245         * libgnat/g-comlin.ads, libgnat/g-comlin.adb (Getopt): Add
246         parameter Quiet. Need to do not output error messages to
247         console. Invalid_Switch exception generation surrounded by an
248         error message.
250 2019-08-12  Ed Schonberg  <schonberg@adacore.com>
252         * exp_ch6.adb (Expand_Actuals. Add_Call_By_Copy_Code): Add code
253         to generate proper checks when an actual for an in-out or out
254         parameter has a non-null access type.  No constraints are
255         applied to an inbound access parameter, but on exit a not-null
256         check must be performed if the type of the actual requires it.
258 2019-08-12  Ed Schonberg  <schonberg@adacore.com>
260         * sem_util.adb (Is_Expaned_Priority_Attribute): Check whether
261         call comes from a rewritten attribute before comparing name with
262         Get_Ceiling run-time subprogram.
264 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
266         * exp_util.ads (Component_May_Be_Bit_Aligned): Small comment
267         tweaks.
268         (Possible_Bit_Aligned_Component): Likewise.
269         (Type_May_Have_Bit_Aligned_Components): Likewise.
270         * exp_util.adb (Component_May_Be_Bit_Aligned): Likewise.
271         (Possible_Bit_Aligned_Component): Likewise.
272         (Type_May_Have_Bit_Aligned_Components): Likewise.
274 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
276         * exp_ch4.adb (Expand_N_Op_Eq): Expand the array equality if
277         either operand is a possibly unaligned slice.
278         * exp_ch6.adb (Expand_Simple_Function_Return): Do not generate a
279         copy for a possibly unaligned object if it is represented as a
280         scalar.
281         * exp_util.adb (Is_Possibly_Unaligned_Slice): Do not always
282         return false if the target doesn't have strict alignment.
284 2019-08-12  Bob Duff  <duff@adacore.com>
286         * sem_ch12.adb (Instantiate_Package_Body): Remove suppression of
287         checks in instances of internal units.
288         * sem_ch6.adb (Analyze_Function_Return): Do not generate a
289         constraint check on an extended_return_statement if the subtype
290         of the return object in the statement is identical to the return
291         subtype of the function.
293 2019-08-12  Bob Duff  <duff@adacore.com>
295         * libgnat/a-cbmutr.adb (Is_Reachable): Declare Idx to be of the
296         base subtype.  Clearly it makes no sense to loop "while Idx >=
297         0", if Idx is of a nonnegative subtype.
299 2019-08-12  Bob Duff  <duff@adacore.com>
301         * libgnat/a-tifiio.adb (Put_Scaled): Prevent AA from being
302         negative, since Field is range 0 .. something.
304 2019-08-12  Bob Duff  <duff@adacore.com>
306         * doc/gnat_ugn/gnat_utility_programs.rst (gnatmetric, gnatpp,
307         gnatstub): Remove documentation for Ada language version
308         switches, and note that they are no longer needed.
310 2019-08-12  Gary Dismukes  <dismukes@adacore.com>
312         * sem_ch5.adb (Prepare_Param_Spec_Loop): Set the parents of the
313         copied low and high bounds in the case where the loop range is
314         given by a discrete_subtype_indication, to prevent hanging (or
315         Assert_Failure) in Insert_Actions.
317 2019-08-12  Ed Schonberg  <schonberg@adacore.com>
319         * sem_ch6.adb (heck_Untagged_Equality): Verify that user-defined
320         equality has the same profile as the predefined equality before
321         applying legality rule in RM 4.5.2 (9.8).
323 2019-08-12  Bob Duff  <duff@adacore.com>
325         * libgnat/a-except.ads: Update obsolete comment, still making
326         clear that this is a variant.  Add explicit default for Id
327         component of Exception_Occurrence, because that value is used.
328         Define Null_Occurrence less redundantly.
329         * libgnat/a-einuoc.adb: Minor simplification of code.
331 2019-08-12  Justin Squirek  <squirek@adacore.com>
333         * libgnat/a-dhfina.adb, libgnat/a-dhfina.ads (Is_Simple_Name,
334         Is_Root_Directory, Is_Parent_Directory,
335         Is_Current_Directory_Name, Is_Relative_Name, Initial_Directory,
336         Relative_Name, Compose): Add implementation and documentation.
337         * libgnat/a-direct.adb (Containing_Directory): Modify routine to
338         use routines from Ada.Directories.Hierarchical_File_Names and
339         remove incorrect special case for parent directories.
340         (Fetch_Next_Entry): Add check for current directory and parent
341         directory and ignore them under certain circumstances.
342         (Simple_Nmae): Add check for null result from
343         Simple_Name_Internal and raise Name_Error.
344         (Simple_Name_Internal): Add explicit check for root directories,
345         sanitize trailing directory separators, and modify behavior so
346         that current and parent directories are considered valid
347         results.
348         * Makefile.rtl: Add entry to GNATRTL_NONTASKING_OBJS.
350 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
352         * freeze.adb (Freeze_Entity): Give the same error for an
353         Object_Size clause on a variable-sized type as for a Size
354         clause.
356 2019-08-12  Gary Dismukes  <dismukes@adacore.com>
358         * sem_prag.adb (Analyze_Pragma, Pragma_Suppress_Initialization):
359         For private types, set the Suppress_Initialization flag on the
360         Full_View of the entity rather than the entity's base type.
362 2019-08-12  Yannick Moy  <moy@adacore.com>
364         * aspects.adb, aspects.ads (Aspect_No_Caching): New aspect.
365         * contracts.adb, contracts.ads (Add_Contract_Item): Add handling
366         of No_Caching.
367         (Analyze_Object_Contract): Add handling of No_Caching.
368         * einfo.adb, einfo.ads
369         (Get_Pragma): Add handling of No_Caching.
370         * doc/gnat_rm/implementation_defined_aspects.rst,
371         doc/gnat_rm/implementation_defined_pragmas.rst: Document new
372         aspect/pragma.
373         * gnat_rm.texi: Regenerate.
374         * par-prag.adb (Prag): New pragma Pragma_No_Caching.
375         * sem_ch13.adb (Analyze_Aspect_Specifications,
376         Check_Aspect_At_Freeze_Point): Add handling of No_Caching.
377         * sem_prag.adb (Analyze_Pragma): Deal with pragma No_Caching.
378         * sem_prag.ads (Analyze_External_Property_In_Decl_Part): Now
379         applies to No_Caching.
380         * sem_util.adb, sem_util.ads (Is_Effectively_Volatile): Add
381         handling of No_Caching.
382         (No_Caching_Enabled): New query function.
383         * snames.ads-tmpl: New names for pragma.
385 2019-08-12  Yannick Moy  <moy@adacore.com>
387         * sem_util.adb, sem_util.ads (Traverse_More_Func,
388         Traverse_More_Proc): Add formal parameter for Itypes traversal.
390 2019-08-12  Yannick Moy  <moy@adacore.com>
392         * exp_attr.adb, exp_attr.ads (Expand_Size_Attribute): New
393         procedure to share part of the attribute expansion with
394         GNATprove mode.
395         (Expand_N_Attribute_Reference): Extract part of the
396         Size/Object_Size expansion in the new procedure
397         Expand_Size_Attribute.
398         * exp_spark.adb (Expand_SPARK_N_Attribute_Reference): Expand
399         Size/Object_Size attributes using the new procedure
400         Expand_Size_Attribute.
402 2019-08-12  Yannick Moy  <moy@adacore.com>
404         * exp_spark.adb (Expand_SPARK_N_Attribute_Reference): Only
405         expand Enum_Rep attribute when its parameter is a literal.
407 2019-08-12  Justin Squirek  <squirek@adacore.com>
409         * sem_eval.adb (Check_Non_Static_Context): Add a condition to
410         determine if a range violation constitues a warning or an error.
411         (Out_Of_Range): Add a condition to determine if a range
412         violation constitues a warning or an error.
414 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
416         * exp_ch4.adb (Real_Range_Check): Do not rewrite the conversion
417         node but its expression instead, after having fetched its
418         current value.  Clear the Do_Range_Check flag on entry.  Return
419         early for a rewritten float-to-float conversion.  Remove
420         redundant local variable.  Suppress all checks when inserting
421         the temporary and do not reanalyze the node.
423 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
425         * sprint.ads: Minor comment tweak.
427 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
429         * checks.adb (Insert_Valid_Check): Do not retrieve the
430         Do_Range_Check flag from the Original_Node but from the
431         Validated_Object.  Remove useless bypass for floating-point
432         types.
434 2019-08-12  Yannick Moy  <moy@adacore.com>
436         * sem_util.adb, sem_util.ads (Traverse_More_Func,
437         Traverse_More_Proc): New traversal subprograms.
439 2019-08-12  Jerome Lambourg  <lambourg@adacore.com>
441         * libgnarl/s-taprop__vxworks.adb (Abort_Handler): Only call
442         s-tpopsp.Self when actually needed.
444 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
446         * exp_ch4.adb (Discrete_Range_Check): Return if checks are
447         suppressed.
449 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
451         * sem_res.adb: Add with & use clause for Sem_Mech and
452         alphabetize.
453         (Resolve_Actuals): Do not apply a scalar range check for the
454         source of a conversion whose result is passed by reference to a
455         valued procedure.
457 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
459         * checks.adb (Insert_Valid_Check): Reset the Do_Range_Check flag
460         on the validated object.
461         * exp_ch6.adb (Add_Call_By_Copy_Code): Reset the Do_Range_Check
462         flag on the actual here, as well as on the Expression if the
463         actual is a N_Type_Conversion node.
464         (Add_Validation_Call_By_Copy_Code): Generate the incoming range
465         check if needed and reset the Do_Range_Check flag on the
466         Expression if the actual is a N_Type_Conversion node.
467         (Expand_Actuals): Do not reset the Do_Range_Check flag here.
468         Generate the incoming range check for In parameters here instead
469         of...
470         (Expand_Call_Helper): ...here.  Remove redudant condition.
471         * sem_res.adb (Resolve_Actuals): Use local variable A_Typ and
472         remove obsolete comments.
473         (Resolve_Type_Conversion): Do not force the Do_Range_Check flag
474         on the operand if range checks are suppressed.
476 2019-08-12  Eric Botcazou  <ebotcazou@adacore.com>
478         * checks.adb (Activate_Range_Check): Remove redundant argument.
479         (Generate_Range_Check): Likewise.
480         (Apply_Float_Conversion_Check): Reset the Do_Range_Check flag on
481         entry and remove redundant condition.
483 2019-08-02  Alexandre Oliva  <oliva@adacore.com>
485         * libgnat/a-exexpr.adb (Begin_Handler_v1, End_Handler_v1): New.
486         (Claimed_Cleanup): New.
487         (Begin_Handler, End_Handler): Document.
488         * gcc-interface/trans.c (gigi): Switch to exception handler
489         ABI #1.
490         (Exception_Handler_to_gnu_gcc): Save the original cleanup
491         returned by begin handler, pass it to end handler, and use
492         EH_ELSE_EXPR to pass a propagating exception to end handler.
493         (gnat_to_gnu): Leave the exception pointer alone for reraise.
494         (add_cleanup): Handle EH_ELSE_EXPR, require it by itself.
496 2019-07-23  Ed Schonberg  <schonberg@adacore.com>
498         * sem_ch13.adb (Check_Aspect_At_End_Of_Declarations,
499         Freeze_Entity_Checks): Include Aspect_CPU with other aspects
500         whose expresssion may depend on a discriminant, and thus require
501         that components of the type be made visible.
503 2019-07-23  Eric Botcazou  <ebotcazou@adacore.com>
505         * checks.adb (Convert_And_Check_Range): Add Suppress parameter
506         and pass it in the call to Insert_Actions.  Rename local
507         variable.
508         (Generate_Range_Check): Minor comment fixes.  Pass Range_Check
509         in the first call to Convert_And_Check_Range and All_Checks in
510         the second call.
511         * exp_ch4.adb (Expand_N_Type_Conversion): Reset the
512         Do_Overflow_Check flag in the float-to-float case too if there
513         is also a range check.
515 2019-07-23  Eric Botcazou  <ebotcazou@adacore.com>
517         * checks.adb (Activate_Overflow_Check): Remove redundant
518         argument.
519         * exp_ch4.adb (Discrete_Range_Check): Reset the overflow flag.
520         (Expand_N_Type_Conversion): Do not reset it here.
522 2019-07-23  Eric Botcazou  <ebotcazou@adacore.com>
524         * repinfo.adb (List_Component_Layout): Pass Decimal to UI_Write.
525         (Write_Val): Likewise.
527 2019-07-23  Ed Schonberg  <schonberg@adacore.com>
529         * aspects.ads: New table Operational_Aspect, used to distinguish
530         between aspects that are view-specific, such as those related to
531         iterators, and representation aspects that apply to all views of
532         a type.
533         * aspects.adb (Find_Aspect): If the aspect being sought is
534         operational, do not ecamine the full view of a private type to
535         retrieve it.
536         * sem_ch5.adb (Analyze_Iterator_Specification): Improve error
537         message when the intended domain of iteration does not implement
538         the required iterator aspects.
540 2019-07-23  Yannick Moy  <moy@adacore.com>
542         * sem_spark.ads (Is_Local_Context): New function.
543         * sem_spark.adb (Check_Declaration): Issue errors on violations
544         of SPARK RM 3.10(4)
545         (Process_Path): Do not issue error on borrow/observe during
546         elaboration, as these are caught by the new rule.
548 2019-07-23  Yannick Moy  <moy@adacore.com>
550         * exp_ch7.adb (Create_Finalizer): Force finalizer not to be
551         Ghost enabled.
552         * exp_dbug.adb (Get_External_Name): Explain special case of
553         Ghost finalizer.
555 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
557         * repinfo.adb (List_Entities): Also list compiled-generated
558         types present as Etype of objects.
560 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
562         * sinfo.ads: Update the documentation about the
563         Do_Division_Check, Do_Overflow_Check and Do_Range_Check flags.
565 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
567         * exp_ch4.adb (Expand_N_Type_Conversion): Beef up comment.
568         (Fixup_Universal_Fixed_Operation): Set the base type instead of
569         the type of the enclosing type conversion on the operation.
571 2019-07-22  Ed Schonberg  <schonberg@adacore.com>
573         * exp_ch4.adb (Expand_N_In): Do not suggest the use of attribute
574         'Valid as a replacement for a range check on a discrete type
575         when the bounds of the range are given by type conversions,
576         because in such a case there are distinct types involved and the
577         subbested attribute replacement would be misplaced.
579 2019-07-22  Yannick Moy  <moy@adacore.com>
581         * sem_spark.adb (Get_Root_Object, Is_Path_Expression,
582         Is_Subpath_Expression): Add parameter Is_Traversal to adapt
583         these functions to the case of paths returned from a traversal
584         function.
585         (Read_Indexes): Handle the case of an if-expression or
586         case-expression.
587         (Check_Statement): Check Emit_Messages only when issuing an
588         error message. This is important as Emit_Messages may store the
589         information that an error was detected.
591 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
593         * checks.adb (Apply_Type_Conversion_Checks): Do not set
594         Do_Range_Check flag on conversions from fixed-point types
595         either.
596         * exp_attr.adb: Add use and with clause for Expander.
597         (Expand_N_Attribute_Reference) <Fixed_Value, Integer_Value>: Set
598         the Conversion_OK flag and do not generate overflow/range checks
599         manually.
600         * exp_ch4.adb (Expand_N_Qualified_Expression): Remove
601         superfluous clearing of Do_Range_Check flag.
602         (Discrete_Range_Check): New procedure to generate a range check
603         for discrete types.
604         (Real_Range_Check): Remove redundant local variable and adjust.
605         Remove useless shortcut.  Clear Do_Range_Check flag on all
606         paths.
607         (Expand_N_Type_Conversion): Remove redundant test on
608         Conversion_OK.  Call Discrete_Range_Check to generate range
609         checks on discrete types.  Remove obsolete code for
610         float-to-integer conversions.  Add code to generate range checks
611         for conversions involving fixed-point types.
613 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
615         * sprint.ads: Fix pasto in comment.
617 2019-07-22  Javier Miranda  <miranda@adacore.com>
619         * sem_res.adb (Resolve_Actuals): Replace code that displaces the
620         pointer to an allocated object to reference its secondary
621         dispatch table by a type conversion (which takes care of
622         handling all cases).
624 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
626         * sprint.adb (Sprint_Node_Actual)
627         <N_Decimal_Fixed_Point_Definition>: Swap a couple of spaces.
628         (Write_Itype): Minor consistency fixes throughout.  Add support
629         for printing ordinary and decimal fixed-point types and
630         subtypes.
632 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
634         * exp_attr.adb (Expand_Loop_Entry_Attribute): Beef up comment.
636 2019-07-22  Ed Schonberg  <schonberg@adacore.com>
638         * libgnat/s-valboo.ads, libgnat/s-valcha.ads,
639         libgnat/s-valdec.ads, libgnat/s-valenu.ads,
640         libgnat/s-valint.ads, libgnat/s-vallld.ads,
641         libgnat/s-vallli.ads, libgnat/s-valllu.ads,
642         libgnat/s-valrea.ads, libgnat/s-valuns.ads,
643         libgnat/s-valwch.ads: Change categorization of packages that
644         implement attribute 'Value from Pure to Preelaborate, to prevent
645         undesirable optimizations when the evaluation of the attribute
646         raises Constraint_Error, but subsequent use of the result of
647         this evsaluation is removed by a subsequent optimization.
649 2019-07-22  Ed Schonberg  <schonberg@adacore.com>
651         * sem_warn.adb (Check_References): Do not emit s warning on a
652         referenced entity with no explicit assignment if the type of the
653         entity has Preelaborable_Initialixation, such as
654         Exception_Occurrence.
656 2019-07-22  Javier Miranda  <miranda@adacore.com>
658         * exp_ch4.adb (Size_In_Storage_Elements): Improve the expansion
659         to handle array indexes that are modular type.
660         (Expand_N_Allocator): For 32-bit targets improve the generation
661         of the runtime check associated with large arrays supporting
662         arrays initialized with a qualified expression.
663         * libgnat/s-imenne.adb (Image_Enumeration_8,
664         Image_Enumeration_16, Image_Enumeration_32): Define the index of
665         Index_Table with range Natural'First .. Names'Length since in
666         the worst case all the literals of the enumeration type would be
667         single letter literals and the Table built by the frontend would
668         have as many components as the length of the names string. As a
669         result of this enhancement, the internal tables declared using
670         Index_Table have a length closer to the real needs, thus
671         avoiding the declaration of large arrays on 32-bit CCG targets.
673 2019-07-22  Yannick Moy  <moy@adacore.com>
675         * sem_ch3.adb (Constrain_Access): Issue a message about ignored
676         constraint.
678 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
680         * sem_ch8.adb (End_Use_Type): Reset the In_Use flag on the
681         class-wide type if the type is tagged.
682         (Use_One_Type): Add commentary on the handling of the class-wide
683         type.
685 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
687         * einfo.ads (Is_For_Access_Subtype): Delete.
688         (Set_Is_For_Access_Subtype): Likewise.
689         * einfo.adb (Is_For_Access_Subtype): Likewise.
690         (Set_Is_For_Access_Subtype): Likewise.
691         (Write_Entity_Flags): Do not write Is_For_Access_Subtype.
692         * exp_ch4.adb (Expand_N_Selected_Component): Do not deal with
693         it.
694         * exp_spark.adb (Expand_SPARK_N_Selected_Component): Likewise.
695         * sem_ch4.adb (Analyze_Explicit_Dereference): Likewise.
696         * sem_ch3.adb (Build_Discriminated_Subtype): Do not build a
697         special private subtype for access-to-record subtypes.
699 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
701         * sem_ch3.adb (Complete_Private_Subtype): Rework the setting of
702         the Etype of the full view for full base types that cannot
703         contain any discriminant.  Remove code and comment about it in
704         the main path.
706 2019-07-22  Ed Schonberg  <schonberg@adacore.com>
708         * sem_ch3.adb (Convert_Bound): Subsidiary of
709         Floating_Point_Type_Declaration, to handle properly range
710         specifications with bounds that may include static constants of
711         a given type rather than real literals.
713 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
715         * sem_aggr.adb (Rewrite_Bound): Be prepared for discriminals
716         too.
717         (Rewrite_Range;): Minor tweak.
718         (Resolve_Record_Aggregate): For a component with default
719         initialization whose expression is an array aggregate, also
720         rewrite the bounds of the component associations, if any.
722 2019-07-22  Gary Dismukes  <dismukes@adacore.com>
724         * exp_ch5.adb (Expand_N_Case_Statement): In the case where a
725         case statement is rewritten as an equivalent if statement,
726         inherit the From_Condition_Expression flag from the case
727         statement.
729 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
731         * sem_ch8.adb (Check_Constrained_Object): Further extend the
732         special optimization to all limited types.
734 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
736         * exp_attr.adb (Expand_N_Attribute_Reference)
737         <Attribute_Enum_Val>: Set No_Truncation on the
738         N_Unchecked_Type_Conversion built around the argument passed to
739         the attribute.
741 2019-07-22  Nicolas Roche  <roche@adacore.com>
743         * libgnat/s-valrea.adb (Scan_Real): Ignore non significative
744         digits to avoid converging to infinity in some cases.
746 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
748         * libgnat/g-encstr.adb (Encode_Wide_String): Fix oversight.
749         (Encode_Wide_Wide_String): Likewise.
751 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
753         * sem_warn.adb (Find_Var): Bail out for a function call with an
754         Out or In/Out parameter.
756 2019-07-22  Nicolas Roche  <roche@adacore.com>
758         * terminals.c (__gnat_tty_waitpid): Support both blocking and
759         not blocking mode.
760         * libgnat/g-exptty.ads (Is_Process_Running): New function.
761         * libgnat/g-exptty.adb (Close): Don't try to interrupt/terminate
762         a process if it is already dead.
764 2019-07-22  Ed Schonberg  <schonberg@adacore.com>
766         * freeze.adb (Freeze_Fixed_Point_Type): When freezing a
767         fixed-point subtype, check whether the parent type declarastion
768         includes an aspect specification for the 'Small type attribute,
769         and inherit the specified value.
771 2019-07-22  Javier Miranda  <miranda@adacore.com>
773         * freeze.adb (Freeze_Subprogram): Check that C++ constructors
774         must have external or link name.
776 2019-07-22  Ed Schonberg  <schonberg@adacore.com>
778         * sem_res.adb (Resolve_Selected_Component): If the prefix has a
779         deferred reference, generate the correct reference now, to
780         indicate that the previous assignment is used.  This prevents
781         spurious warnings on useless assignments when compiling with all
782         warnings enabled. when there is a subsequent call in the same
783         stqtement list, in which the prefix of the selected component is
784         the actual for an out parameter.
786 2019-07-22  Eric Botcazou  <ebotcazou@adacore.com>
788         * exp_attr.adb (Expand_Loop_Entry_Attribute): Copy the condition
789         of a while loop instead of simply relocating it.
791 2019-07-18  Arnaud Charlet  <charlet@adacore.com>
793         * Makefile.rtl, expect.c, env.c, aux-io.c, mkdir.c, initialize.c,
794         cstreams.c, raise.c, tracebak.c, adadecode.c, init.c, raise-gcc.c,
795         argv.c, adaint.c, adaint.h, ctrl_c.c, sysdep.c, rtinit.c, cio.c,
796         seh_init.c, exit.c, targext.c: Introduce a "STANDALONE" mode where C
797         runtime files do not have any dependency on GCC include files.
798         Remove unnecessary includes.
799         Remove remaining references to VMS in runtime C file.
800         * runtime.h: new File.
802 2019-07-13  Andreas Schwab  <schwab@linux-m68k.org>
804         * Makefile.rtl: Use g-sercom__linux.adb for all linuxes.
806 2019-07-11  Piotr Trojanek  <trojanek@adacore.com>
808         * lib-writ.adb (Ensure_System_Dependency,
809         Up_To_Date_ALI_File_Exists, Write_ALI): Replace low-level access
810         to table with a high-level query.
812 2019-07-11  Piotr Trojanek  <trojanek@adacore.com>
814         * checks.adb: Fix typo in comment.
815         * sem.adb (Semantics): Avoid repeated calls to
816         In_Extended_Main_Source_Unit by reusing an already-cached
817         result.
818         * sem_util.adb (First_Global): Fix style.
820 2019-07-11  Yannick Moy  <moy@adacore.com>
822         * sem_res.adb (Resolve_Call): Do not perform dimensionality
823         checking on inlined bodies.
825 2019-07-11  Yannick Moy  <moy@adacore.com>
827         * debug.adb: Flip meaning of debug switch -gnatdF.
829 2019-07-11  Yannick Moy  <moy@adacore.com>
831         * sem_eval.adb (Is_Same_Value): Add special case for rewritten
832         Loop_Entry attribute.
834 2019-07-11  Claire Dross  <dross@adacore.com>
836         * gnat1drv.adb: SPARK checking rules for pointer aliasing are
837         moved to GNATprove backend.
838         * sem_spark.ads, sem_spark.adb (Sem_SPARK): Is now a generic
839         unit. Takes as parameters:
840          - Retysp which is used to query the most underlying type
841            visible in SPARK. We do not introduce aliasing checks for
842            types which are not visibly deep.
843          - Component_Is_Visible_In_SPARK is used to avoid doing pointer
844            aliasing checks on components which are not visible in SPARK.
845          - Emit_Messages returns True in the second phase of SPARK
846            analysis. Error messages for failed aliasing checks are only
847            output in this case.
848         Additionally, errors on constructs not supported in SPARK are
849         removed as duplicates of marking errors. Components are stored
850         in the permission map using their original component to avoid
851         inconsistencies between components of different views of the
852         same type.
853         (Check_Expression): Handle delta constraints.
854         (Is_Deep): Exported so that we can check for SPARK restrictions
855         on deep types inside SPARK semantic checkings.
856         (Is_Traversal_Function): Exported so that we can check for SPARK
857         restrictions on traversal functions inside SPARK semantic
858         checkings.
859         (Check_Call_Statement, Read_Indexes): Check wether we are
860         dealing with a subprogram pointer type before querying called
861         entity.
862         (Is_Subpath_Expression): Image attribute can appear inside a
863         path.
864         (Check_Loop_Statement): Correct order of statements in the loop.
865         (Check_Node): Ignore raise nodes.
866         (Check_Statement): Use Last_Non_Pragma to get the object
867         declaration in an extended return statement.
869 2019-07-11  Patrick Bernardi  <bernardi@adacore.com>
871         * bindgen.adb (Gen_Main): Do not generate a reference to
872         Ada_Main_Program_Name when the Minimal_Binder flag is set.
873         (Gen_Output_File_Ada): Do not output GNAT_Version and
874         Ada_Main_Program_Name info if Minimal_Binder flag is set.
875         * bindusg.adb: Add documentation for new -minimal switch.
876         * gnatbind.adb (Scan_Bind_Arg): Scan -minimal switch.
877         * opt.ads: Add new global flag Minimal_Binder to indicate if the
878         binder should not produce global variables.
879         * doc/gnat_ugn/building_executable_programs_with_gnat.rst:
880         Update documentation with new binder -minimal switch.
881         * gnat_ugn.texi: Regenerate.
883 2019-07-11  Eric Botcazou  <ebotcazou@adacore.com>
885         * Makefile.rtl: Add warning note about compilation flags and
886         capitalize.
888 2019-07-11  Ed Schonberg  <schonberg@adacore.com>
890         * exp_ch9.adb (Expand_N_Protected_Type_Declaaration): New
891         subsidiary routine Replace_Access_Definition, to handle properly
892         a protected type PT one of whose private components is of type
893         access PT.
895 2019-07-11  Dmitriy Anisimkov  <anisimko@adacore.com>
897         * libgnat/g-socket.ads (Level_Type): Add enumerators for
898         IP_Protocol_For_ICMP, IP_Protocol_For_IGMP,
899         IP_Protocol_For_RAW_Level.
900         * libgnat/g-socket.adb (Levels): Handle them.
901         * s-oscons-tmplt.c: Import socket protocols defined in
902         netinet/in.h.
904 2019-07-11  Claire Dross  <dross@adacore.com>
906         * libgnat/a-cfhama.adb, libgnat/a-cfhase.adb (Free): Do not
907         reset the Has_Element flag if no element is freed.
909 2019-07-11  Arnaud Charlet  <charlet@adacore.com>
911         * errno.c: Remove obsolete support for MaRTE OS.
913 2019-07-11  Ed Schonberg  <schonberg@adacore.com>
915         * exp_ch4.adb (Expand_N_Type_Conversion): If a predicate check
916         is generated, analyze it with range check suppressed, because
917         that check has been previously applied.
918         * exp_ch5.adb (Expand_N_Assignment_Statement): If the RHS is a
919         type conversion to the type of the LHS, do not apply a predicate
920         check to the RHS because it will have been generated already
921         during its expansion.
922         * exp_ch6.adb (Can_Fold_Predicate_Call): Extend processing to
923         handle a predicate check on a constant entity whose value is
924         static.
926 2019-07-11  Hristian Kirtchev  <kirtchev@adacore.com>
928         * bindo.adb: Remove the documentation of switch -d_N because it
929         is no longer in use.
930         * bindo-graphs.ads, bindo-graphs.adb (Is_Spec_Before_Body_Edge):
931         New routine.
932         * bindo-writers.adb (Write_Dependency_Edge): Add the missing
933         case of a spec-before-body edge.
935 2019-07-11  Dmitriy Anisimkov  <anisimko@adacore.com>
937         * libgnat/g-socket.ads (Mode_Type): Add a Socket_Raw enumerator.
938         * libgnat/g-socket.adb (Modes): Handle Socket_Raw.
940 2019-07-11  Justin Squirek  <squirek@adacore.com>
942         * exp_ch9.adb (Build_Private_Protected_Declaration): Add
943         exception for the moving of pragmas to internally generated
944         specs for pragma Unreferenced.
946 2019-07-11  Bob Duff  <duff@adacore.com>
948         * doc/gnat_ugn/gnat_utility_programs.rst: Fix inconsistent
949         documentation for gnatmetric.
950         * gnat_ugn.texi: Regenerate.
952 2019-07-11  Bob Duff  <duff@adacore.com>
954         * doc/gnat_ugn/gnat_utility_programs.rst: Document gnatpp's
955         --spaces-only switch.
957 2019-07-11  Hristian Kirtchev  <kirtchev@adacore.com>
959         * sem_util.adb (Null_Status): Assume that an erroneous construct
960         has an undefined null status.
962 2019-07-11  Hristian Kirtchev  <kirtchev@adacore.com>
964         * checks.adb, exp_ch6.adb, gnat1drv.adb, sem_aux.adb,
965         sem_ch2.adb, sem_ch8.adb, sem_res.adb: Minor reformatting.
967 2019-07-11  Hristian Kirtchev  <kirtchev@adacore.com>
969         * sem_ch8.adb (Analyze_Object_Renaming): Obtain the object being
970         renamed using routine Get_Object_Name which takes care of
971         various name forms.
972         (Get_Object_Name): New routine.
974 2019-07-11  Ed Schonberg  <schonberg@adacore.com>
976         * exp_ch6.adb (Can_Fold_Predicate_Call): New function,
977         subsidiary of Expand_Call_Helper, to compute statically a
978         predicate check when the argument is a static integer.
980 2019-07-11  Hristian Kirtchev  <kirtchev@adacore.com>
982         * sem_res.adb (Resolve_Op_Not): Do not rewrite an equality
983         operator into a function call when the operator is intrinsic.
985 2019-07-11  Thomas Quinot  <quinot@adacore.com>
987         * sem_prag.adb (Analyze_Pragma, case pragma Check): Do not call
988         Set_SCO_Pragma_Enabled for the dynamic predicate case.
990 2019-07-11  Hristian Kirtchev  <kirtchev@adacore.com>
992         * exp_util.ads, exp_util.adb (Needs_Finalization): Move to
993         Sem_Util.
994         * sem_ch9.adb (Analyze_Protected_Definition): Code cleanup. Mark
995         the protected type as having controlled components when it
996         contains at least one such component.
997         * sem_util.ads, sem_util.adb (Needs_Finalization): New
998         function.
1000 2019-07-11  Eric Botcazou  <ebotcazou@adacore.com>
1002         * alloc.ads (Rep_JSON_Table_Initial): New constant.
1003         (Rep_JSON_Table_Increment): Likewise.
1004         * debug.adb: Document -gnatd_j switch.
1005         * gcc-interface/Make-lang.in (GNAT_ADA_OBJS): Add
1006         repinfo-input.o.
1007         * gnat1drv.adb: Add with clause for Repinfo.Input.
1008         Add with and use clauses for Sinput.
1009         (Read_JSON_Files_For_Repinfo): New procedure.
1010         (Gnat1drv1): Deal with -gnatd_j switch.
1011         * repinfo-input.ad[sb]: New unit.
1012         * snames.ads-tmpl (Name_Discriminant): New constant.
1013         (Name_Operands): Likewise.
1015 2019-07-11  Justin Squirek  <squirek@adacore.com>
1017         * checks.adb (Apply_Accessibility_Check): Add check for constant
1018         folded conditions on accessibility checks.
1020 2019-07-11  Arnaud Charlet  <charlet@adacore.com>
1022         * libgnarl/g-thread.ads, libgnarl/g-thread.adb (Get_Thread):
1023         Update comments. Add new version taking a Task_Id.
1025 2019-07-11  Hristian Kirtchev  <kirtchev@adacore.com>
1027         * bindo.adb: Update the section of switches and debugging
1028         elaboration issues.
1029         * bindo.ads: Add type Elaboration_Phase.
1030         * bindo-augmentors.adb: Add use clause for
1031         Bindo.Writers.Phase_Writers.
1032         (Augment_Library_Graph): Signal the start and end of the
1033         aubmentation phase.
1034         * bindo-builders.adb: Add with and use clause for Bindo.Writers.
1035         Add use clause for Bindo.Writers.Phase_Writers.
1036         (Build_Invocation_Graph): Signal the start and end of the
1037         invocation graph construction phase.
1038         (Build_Library_Graph): Signal the start and end of the library
1039         graph construction phase.
1040         * bindo-diagnostics.adb: Add use clause for
1041         Bindo.Writers.Phase_Writers.
1042         (Diagnose_Cycle): Signal the start and end of the cycle
1043         diagnostic phase.
1044         * bindo-elaborators.adb: Add use clause for
1045         Bindo.Writers.Phase_Writers.
1046         (Elaborate_Units): Signal the start and end of the unit
1047         elaboration phase.
1048         * bindo-graphs.adb: Add use clause for
1049         Bindo.Writers.Phase_Writers.
1050         (Find_Components): Signal the start and end of the component
1051         discovery phase.
1052         (Find_Cycles): Signal the start and end of the cycle discovery
1053         phase.
1054         * bindo-units.adb: Add with and use clause for Bindo.Writers.
1055         Add use clause for Bindo.Writers.Phase_Writers.
1056         (Collect_Elaborable_Units): Signal the start and end of the unit
1057         collection phase.
1058         * bindo-validators.adb: Add with and use clause for
1059         Bindo.Writers.  Add use clause for Bindo.Writers.Phase_Writers.
1060         (Validate_Cycles, Validate_Elaboration_Order,
1061         Validate_Invocation_Graph, Validate_Library_Graph): Signal the
1062         start and end of the libray graph validation phase.
1063         * bindo-writers.ads, bindo-writers.adb: Add new nested package
1064         Phase_Writers.
1065         * debug.adb: Update the documentation of switch d_S.
1067 2019-07-11  Yannick Moy  <moy@adacore.com>
1069         * sem_res.adb (Check_Argument_Order): Special case calls to
1070         operators.
1072 2019-07-10  Dmitriy Anisimkov  <anisimko@adacore.com>
1074         * libgnat/s-ststop.adb: Remove System.Strings.Stream_Ops
1075         dependence on System.Streams.Stream_IO.
1077 2019-07-10  Ed Schonberg  <schonberg@adacore.com>
1079         * sem_ch2.adb (Analyze_Integer_Literal): Preserve the type of
1080         the literal if prior analysis determined that its type is a
1081         modular integer type.
1083 2019-07-10  Doug Rupp  <rupp@adacore.com>
1085         * init.c: Do not attempt to re-arm guard page on x86_64-vx7(r2).
1087 2019-07-10  Ed Schonberg  <schonberg@adacore.com>
1089         * sem_ch8.adb (Check_Constrained_Object): A record that is
1090         limited because of the presence of a limited component is
1091         constrained, and no subtype indiciation needs to be created for
1092         it, just as is the case for declared limited records.
1094 2019-07-10  Yannick Moy  <moy@adacore.com>
1096         * sem_aux.adb, sem_aux.ads (Is_Protected_Operation): New
1097         function to determine if a subprogram is protected.
1098         * sem_spark.adb (Setup_Protected_Components): New procedure to
1099         add protected components to the environment.
1100         (Check_Callable_Body): Call the new Setup_Protected_Components.
1101         (Check_Package_Spec): Merge local environment with enclosing one
1102         when done.
1104 2019-07-10  Claire Dross  <dross@adacore.com>
1106         * sem_spark.adb (Check_Expression): Allow digits constraints as
1107         input.
1108         (Illegal_Global_Usage): Pass in the entity.
1109         (Is_Subpath_Expression): New function to allow different nodes
1110         as inner parts of a path expression.
1111         (Read_Indexes): Allow concatenation and aggregates with box
1112         expressions.  Allow attributes Update and Loop_Entry.
1113         (Check_Expression): Allow richer membership test.
1114         (Check_Node): Ignore bodies of generics.
1115         (Get_Root_Object): Allow concatenation and attributes.
1117 2019-07-10  Hristian Kirtchev  <kirtchev@adacore.com>
1119         * sem_ch6.adb (Check_Discriminant_Conformance): Use Find_Type to
1120         discover the type of a full view discriminant.
1122 2019-07-10  Arnaud Charlet  <charlet@adacore.com>
1124         * doc/gnat_ugn/gnat_and_program_execution.rst: Improve gnatmem's
1125         doc for the depth switch.
1127 2019-07-10  Bob Duff  <duff@adacore.com>
1129         * doc/gnat_ugn/gnat_utility_programs.rst: Document gnatpp's
1130         --source-line-breaks switch.
1132 2019-07-10  Justin Squirek  <squirek@adacore.com>
1134         * doc/gnat_rm/implementation_defined_attributes.rst: Add mention
1135         of 'Image attribute with 'Img's entry to mention additional
1136         added 2012 usage of Obj'Image.
1137         * doc/gnat_rm/implementation_defined_pragmas.rst: Correct
1138         mispelling of Async_Writers.
1139         * gnat_rm.texi: Regenerate.
1140         * sem_prag.adb (Analyze_Pragma): Correct mispelling of
1141         Async_Writers.
1142         * sem_util.adb (State_Has_Enabled_Property): Correct mispelling
1143         of Async_Writers.
1145 2019-07-10  Simon Buist  <buist@adacore.com>
1147         * sem_util.ads (Child_Prefix): New constant.
1148         * sem_util.adb (Unique_Name): Add a special prefix to child
1149         units that have a nested subprogram or package.
1151 2019-07-10  Arnaud Charlet  <charlet@adacore.com>
1153         * sfn_scan.adb (Scan_SFN_Pragmas): Add pragma Assert.
1155 2019-07-10  Hristian Kirtchev  <kirtchev@adacore.com>
1157         * sem_ch3.adb (Check_Nonoverridable_Aspects): Correct the
1158         spelling in certain error messages.
1159         (Check_Pragma_Implemented): Correct the spelling in certain
1160         error messages.
1162 2019-07-10  Eric Botcazou  <ebotcazou@adacore.com>
1164         * Makefile.rtl (GNATRTL_NONTASKING_OBJS): Add g-brapre.
1165         * libgnat/g-brapre.ads: New package specification.
1166         * doc/gnat_rm/the_gnat_library.rst: Document it.
1167         * gnat_rm.texi: Regenerate.
1169 2019-07-10  Yannick Moy  <moy@adacore.com>
1171         * osint-c.adb (Set_File_Name): Always add extension for multiple
1172         units per file mode.
1174 2019-07-10  Corentin Gay  <gay@adacore.com>
1176         * sysdep.c: Put include directive for 'vxWorks.h' before any
1177         other VxWorks headers.
1179 2019-07-10  Eric Botcazou  <ebotcazou@adacore.com>
1181         * doc/gnat_rm/implementation_defined_attributes.rst
1182         (Scalar_Storage_Order): Minor tweaks.  Add note about debuggers.
1183         * gnat_rm.texi: Regenerate.
1185 2019-07-10  Hristian Kirtchev  <kirtchev@adacore.com>
1187         * exp_ch4.adb (Expand_N_Case_Expression): Mark the generated
1188         assignments to the temporary result as being OK because the
1189         expansion of case expressions is correct by construction.
1190         (Is_Copy_Type): Update the predicate to match the comment
1191         within.
1193 2019-07-10  Hristian Kirtchev  <kirtchev@adacore.com>
1195         * bindo-graphs.adb, bindo.adb, debug.adb, exp_ch6.adb,
1196         sem_ch10.adb, sem_ch13.adb, sem_ch3.adb, sem_ch4.adb,
1197         sem_ch6.adb, sem_ch7.adb, sem_res.adb, sem_spark.adb,
1198         sem_util.adb, warnsw.ads: Minor reformatting.
1200 2019-07-10  Joffrey Huguet  <huguet@adacore.com>
1202         * libgnat/a-strbou.ads, libgnat/a-strfix.ads,
1203         libgnat/a-strunb.ads, libgnat/a-strunb__shared.ads: Add global
1204         contracts, contract cases, preconditions and postconditions to
1205         procedures and functions.
1207 2019-07-10  Doug Rupp  <rupp@adacore.com>
1209         * sysdep.c (__gnat_is_file_not_found_error): Reformulate to also
1210         work for vxworks7r2 SR0610.
1212 2019-07-10  Doug Rupp  <rupp@adacore.com>
1214         * env.c (__gnat_environ): Reformulate to also work for
1215         vxworks7r2 SR0610.
1217 2019-07-10  Patrick Bernardi  <bernardi@adacore.com>
1219         * Makefile.rtl: Handle vxworks7r2 ppc target
1221 2019-07-10  Hristian Kirtchev  <kirtchev@adacore.com>
1223         * bindo.adb: Update the section on switches.
1224         * bindo-graphs.adb
1225         (Add_Cycle, Add_Vertex_And_Complement): Remove.
1226         (Create): The graph no longer needs a set of recorded cycles
1227         because the cycles are not rediscovered in permuted forms.
1228         (Cycle_End_Vertices): New routine.
1229         (Destroy): The graph no longer needs a set of recorded cycles
1230         because the cycles are not rediscovered in permuted forms.
1231         (Destroy_Library_Graph_Vertex): Move to the library level.
1232         (Find_All_Cycles_Through_Vertex, Find_All_Cycles_With_Edge):
1233         Remove.
1234         (Find_Cycles_From_Successor, Find_Cycles_From_Vertex,
1235         Find_Cycles_In_Component, Has_Elaborate_All_Edge): New routines.
1236         (Insert_And_Sort): Remove.
1237         (Is_Elaborate_Body_Edge): Use predicate
1238         Is_Vertex_With_Elaborate_Body.
1239         (Is_Recorded_Cycle): Remove.
1240         (Is_Vertex_With_Elaborate_Body): New routine.
1241         (Normalize_And_Add_Cycle): Remove.
1242         (Precedence): Rename to xxx_Precedence, where xxx relates to the
1243         input.  These versions better reflect the desired input
1244         precedence.
1245         (Record_Cycle): New routine.
1246         (Remove_Vertex_And_Complement, Set_Is_Recorded_Cycle): Remove.
1247         (Trace_xxx): Update all versions to use debug switch -d_t.
1248         (Trace_Component): New routine.
1249         (Trace_Eol): Removed.
1250         (Trace_Vertex): Do not output the component as this information
1251         is already available when the component is traced.
1252         (Unvisit, Visit): New routine.
1253         * bindo-graphs.ads: Add new instance LGV_Lists.  Remove instance
1254         RC_Sets.  Update the structure of type Library_Graph_Attributes
1255         to remove the set of recorded cycles.
1256         (Destroy_Library_Graph_Vertex): Move to the library level.
1257         * bindo-writers.adb (Write_Component_Vertices): Output
1258         information about the number of vertices.
1259         * debug.adb: Document the use of binder switch -d_t.  Update the
1260         use of binder switch -d_T.
1262 2019-07-10  Yannick Moy  <moy@adacore.com>
1264         * sem_spark.adb (Get_Root_Object): Replace precondition by error
1265         message.
1266         (Read_Indexes): Replace precondition by error message.
1267         (Check_Callable_Body): Check only traversal function returns an
1268         anonymous access type.
1269         (Check_Expression): Issue error on unexpected expression as
1270         path.
1271         * sem_util.adb (First_Global): Fix access to global on
1272         entry/task.
1274 2019-07-10  Javier Miranda  <miranda@adacore.com>
1276         * exp_ch6.adb (Is_Class_Wide_Interface_Type): New subprogram.
1277         (Expand_Call_Helper): Handle non-limited views when we check if
1278         any formal is a class-wide interface type.
1279         * exp_disp.adb (Expand_Interface_Actuals): Handle non-limited
1280         views when we look for interface type formals to force "this"
1281         displacement.
1283 2019-07-10  Ed Schonberg  <schonberg@adacore.com>
1285         * sem_res.adb (Resolve_Equality_Op): Do not replace the resolved
1286         operator by its alias if expander is not active, because the
1287         operand type may not be frozen yet and its inherited operations
1288         have not yet been created.
1290 2019-07-10  Hristian Kirtchev  <kirtchev@adacore.com>
1292         * bindo-elaborators.adb (Elaborate_Units): Set attribute
1293         Elab_Position of all elaborated units.
1294         (Set_Unit_Elaboration_Positions): New routine.
1296 2019-07-10  Gary Dismukes  <dismukes@adacore.com>
1298         * exp_util.adb: Reformatting and a typo fix.
1300 2019-07-10  Yannick Moy  <moy@adacore.com>
1302         * exp_util.adb (Remove_Side_Effects): Prefer renamings for
1303         objects of possible owning type in GNATprove mode.
1305 2019-07-09  Ed Schonberg  <schonberg@adacore.com>
1307         * sem_ch3.adb (Analyze_Object_Declaration): If the object type
1308         is a composite type that has a dynamic predicate and, the
1309         expression in the declaration is an aggregate, the generated
1310         predicate check must appear after the expanded code for the
1311         aggregate, which will appear after the rewritten object
1312         declarastion.
1314 2019-07-09  Justin Squirek  <squirek@adacore.com>
1316         * sem_eval.adb (Expr_Value_E): Add conditional to correctly
1317         handle constant enumerated character types.
1319 2019-07-09  Eric Botcazou  <ebotcazou@adacore.com>
1321         * libgnarl/s-osinte__mingw.ads (CRITICAL_SECTION): Use proper
1322         type for SpinCount component.
1324 2019-07-09  Justin Squirek  <squirek@adacore.com>
1326         * exp_ch4.adb (Expand_N_Allocator): Add conditional to detect
1327         the presence of anoymous access type allocators and issue a
1328         warning if the appropriate warning flag is enabled.
1329         * warnsw.ads: Add new warning flag for anonymous allocators
1330         * warnsw.adb (All_Warnings, Restore_Warnings, Save_Warnings,
1331         Set_Underscore_Warning_Switch): Register new flags.
1332         (WA_Warnings): Register new flag as an "all warnings" switch
1333         * usage.adb,
1334         doc/gnat_ugn/building_executable_programs_with_gnat.rst:
1335         Document new warning switches -gnatw_a and -gnatw_A.
1336         * gnat_ugn.texi: Regenerate.
1338 2019-07-09  Ed Schonberg  <schonberg@adacore.com>
1340         * sem_ch4.adb (Diagnose_Call): Improve error recovery when a
1341         local subprogram name hides a possible candidate name declared
1342         in a child package in the context of the current unit.
1343         * sem_ch6.adb (Process_Formals): Protect against malformed
1344         formal types when the parameter type does not denote an entity.
1346 2019-07-09  Hristian Kirtchev  <kirtchev@adacore.com>
1348         * bindo-augmentors.adb (Visit_Elaboration_Root): Do not start a
1349         DFS from an elaboration root whose corresponding unit lacks
1350         elaboration code. This behavior mimics that of the old
1351         elaboration order mechanism.
1352         * bindo-graphs.adb (Find_All_Cycles_Through_Vertex): Move the
1353         vertex tracing within the functional branches of the routine.
1354         This prevents spurious trace output.
1355         (Has_No_Elaboration_Code): New routine.
1356         (Trace_Cycle, Trace_Edge): Update the various Ids to use the
1357         "standard" trace format.
1358         * bindo-graphs.ads (Has_No_Elaboration_Code): New routine.
1359         * bindo-units.ads, bindo-units.adb (Has_No_Elaboration_Code):
1360         New routine.
1362 2019-07-09  Piotr Trojanek  <trojanek@adacore.com>
1364         * ali.ads, bindo-graphs.adb, bindo-validators.adb, clean.adb,
1365         doc/gnat_ugn/elaboration_order_handling_in_gnat.rst, einfo.ads,
1366         exp_aggr.adb, exp_ch13.adb, exp_ch4.adb, exp_ch5.adb,
1367         exp_ch6.adb, exp_ch7.adb, exp_ch9.adb, exp_pakd.adb,
1368         fname-uf.ads, gnatlink.adb, inline.adb, lib.ads, make.adb,
1369         namet.ads, opt.ads, par-ch4.adb, par-ch6.adb, par-labl.adb,
1370         prep.adb, sem_aggr.adb, sem_ch13.adb, sem_ch4.adb, sem_ch5.adb,
1371         sem_ch6.adb, sem_ch6.ads, sem_ch7.adb, sem_ch8.adb, sem_dim.adb,
1372         sem_disp.adb, sem_prag.adb, sem_res.adb, sem_warn.adb,
1373         sinfo.ads: Replace ".  " with ". ". Minor reformatting and typo
1374         corrections.
1375         * gnat_ugn.texi: Generate.
1377 2019-07-09  Hristian Kirtchev  <kirtchev@adacore.com>
1379         * bindo.ads: Move type Precedence_Kind from the private to the
1380         visible part of the unit.
1381         * bindo-augmentors.adb: Remove the use of global data as it is
1382         bad practice.
1383         (Augment_Library_Graph): Update the parameter profile.
1384         (Is_Visited, Set_Is_Visited): Remove.
1385         (Visit_Elaboration_Root, Visit_Elaboration_Roots): Update the
1386         parameter profile and comment on usage.
1387         (Visit_Vertex): Likewise.  Also keep track of which invocation
1388         edge activates a task.
1389         * bindo-augmentors.ads (Augment_Library_Graph): Update the
1390         parameter profile and comment on usage.
1391         * bindo-builders.adb (Create_Forced_Edge,
1392         Create_Spec_And_Body_Edge, Create_With_Edge): Update the call to
1393         Add_Edge.
1394         * bindo-diagnostics.adb: Add with end use clauses for Restrict
1395         and Rident.
1396         (Output_Dynamic_Model_Suggestions): Remove.
1397         (Output_Invocation_Related_Suggestions): New routine.
1398         (Output_Suggestions): Output all invocation-related suggestions
1399         together.
1400         * bindo-elaborators.adb: Remove types Comparator_Ptr and
1401         Predicate_Ptr.
1402         (Find_Best_Vertex): Update the parameter profile.
1403         * bindo-graphs.adb (Activates_Task): New routine.
1404         (Add_Body_Before_Spec_Edge): Update the call to
1405         Add_Edge_With_Return.
1406         (Add_Edge): Update the parameter profile and the call to
1407         Add_Edge_With_Return.
1408         (Add_Edge_With_Return): Update the parameter profile and comment
1409         on usage.
1410         (At_Least_One_Edge_Satisfies): New routine.
1411         (Contains_Elaborate_All_Edge): Reimplement.
1412         (Contains_Static_Successor_Edge, Contains_Task_Activation): New
1413         routine.
1414         (Contains_Weak_Static_Successor): Remove.
1415         (Is_Static_Successor_Edge): New routine.
1416         * bindo-graphs.ads: Add types LGE_Predicate_Ptr,
1417         LGV_Comparator_Ptr, and LGV_Predicate_Ptr.  Update type
1418         Library_Graph_Edge_Attributes to capture whether an invocation
1419         edge activates a task.  Update the value of
1420         No_Library_Graph_Edge_Attributes.
1421         (Activates_Task): Update the parameter profile and comment on
1422         usage.
1423         (Contains_Static_Successor_Edge, Contains_Task_Activation): New
1424         routines.
1425         (Contains_Weak_Static_Successor): Remove.
1426         * doc/gnat_ugn/elaboration_order_handling_in_gnat.rst:
1427         Update the documentation to reflect the new task-related advice.
1428         * gnat_ugn.texi: Regenerate.
1430 2019-07-09  Piotr Trojanek  <trojanek@adacore.com>
1432         * exp_util.adb (Containing_Package_With_Ext_Axioms): Replace
1433         low-level Ekind test with a high-level wrapper.
1435 2019-07-09  Arnaud Charlet  <charlet@adacore.com>
1437         * libgnat/s-memory.adb: Disable calls to Abort defer/undefer
1438         when ZCX_By_Default.
1440 2019-07-09  Javier Miranda  <miranda@adacore.com>
1442         * sem_ch13.adb (Rep_Item_Too_Early): Representation clauses are
1443         not allowed for a derivation of a generic type. Extend the
1444         current test to check that none of the parents is a generic
1445         type.
1447 2019-07-09  Hristian Kirtchev  <kirtchev@adacore.com>
1449         * exp_ch9.adb, exp_util.adb, repinfo.adb, sem_ch12.adb,
1450         sem_prag.adb, sem_res.adb, sem_spark.adb, sem_util.adb: Minor
1451         reformatting.
1453 2019-07-09  Ed Schonberg  <schonberg@adacore.com>
1455         * sem_res.adb (Resolve_Equality_Op): If the node was overloaded,
1456         set properly the entity to which the node has been resolved. The
1457         original entity is the first one found during analysis, and is
1458         not necessarily the resolved one.
1459         (Resolve_Op_Not): If the argument of negation is an overloaded
1460         equality operation, call its resolution directly given that the
1461         context type does not participate in overload resolution.
1463 2019-07-09  Hristian Kirtchev  <kirtchev@adacore.com>
1465         * bindo.adb: Remove with and use clauses for Debug.  Add with
1466         and use clauses for Opt.
1467         (Find_Elaboration_Order): Enable the v4.0 elaboration order. The
1468         v3.0 mechanism is now available under binder switch -H.
1469         * bindusg.adb (Display): Enable switch -H.
1470         * debug.adb: Free compiler switch -gnatd_G.  Free binder switch
1471         -d_N.
1472         * sem_elab.adb: Update the section on switches to remove
1473         -gnatd_G.
1474         (Invocation_Graph_Recording_OK): The invocation graph is now
1475         unconditionally recorded in ALI files.
1476         * switch-b.adb (Scan_Binder_Switches): Scan switch -H.
1477         * doc/gnat_ugn/building_executable_programs_with_gnat.rst:
1478         Update the documentation on compiler switches related to
1479         elaboration.  Update the documentation on binder switches to
1480         include switch -H.
1481         * doc/gnat_ugn/elaboration_order_handling_in_gnat.rst: Update
1482         the documentation on elaboration order handling in GNAT.
1483         * gnat_ugn.texi: Regenerate.
1485 2019-07-09  Eric Botcazou  <ebotcazou@adacore.com>
1487         * repinfo.adb (List_Entities): Disregard formals altogether.
1488         (List_Name): Properly escape the double quote in the JSON
1489         output.
1491 2019-07-09  Javier Miranda  <miranda@adacore.com>
1493         * exp_util.adb (Remove_Side_Effects): Preserve the
1494         Do_Range_Check flag.
1496 2019-07-09  Yannick Moy  <moy@adacore.com>
1498         * sinfo.ads: Refine comment for Do_Range_Check.
1500 2019-07-09  Yannick Moy  <moy@adacore.com>
1502         * exp_spark.adb (Expand_SPARK_N_Attribute_Reference): Expand
1503         attribute reference on Enum_Rep.
1505 2019-07-09  Ed Schonberg  <schonberg@adacore.com>
1507         * sem_ch12.adb (Instantiate_Formal_Package): Handle properly the
1508         case where the actual for a formal package in an instance is the
1509         current instance of an enclosing generic package.
1510         (Check_Formal_Packages): If the formal package declaration is
1511         box-initialized or lacks associations altogether, no internal
1512         instance was created to verify conformance, and there is no
1513         validating package to remove from tree.
1515 2019-07-09  Yannick Moy  <moy@adacore.com>
1517         * freeze.adb (Build_Renamed_Body): Do not set body to inline in
1518         GNATprove mode.
1520 2019-07-09  Yannick Moy  <moy@adacore.com>
1522         * exp_util.adb (Expand_Subtype_From_Expr): Still expand the type
1523         of static expressions in GNATprove_Mode.
1524         * sem_ch3.adb (Analyze_Object_Declaration): Remove obsolete
1525         special case for GNATprove_Mode.
1527 2019-07-09  Piotr Trojanek  <trojanek@adacore.com>
1529         * doc/gnat_rm/the_gnat_library.rst,
1530         doc/gnat_ugn/building_executable_programs_with_gnat.rst,
1531         erroutc.adb, libgnat/g-comlin.adb, libgnat/g-comlin.ads,
1532         libgnat/g-regexp.ads, libgnat/g-regpat.ads,
1533         libgnat/g-spipat.ads, libgnat/s-os_lib.ads,
1534         libgnat/s-regexp.ads: Reword "wild card" to "wildcard".
1535         * gnat_rm.texi, gnat_ugn.texi: Regenerate.
1537 2019-07-09  Yannick Moy  <moy@adacore.com>
1539         * sem_spark.adb (Check_Expression): Handle correctly implicit
1540         assignments as part of allocators and (extension) aggregates.
1541         (Get_Root_Object): Adapt for new path expressions.
1542         (Is_Path_Expression): Return True for (extension) aggregate.
1544 2019-07-09  Piotr Trojanek  <trojanek@adacore.com>
1546         * einfo.ads: Fix a typo.
1548 2019-07-09  Ed Schonberg  <schonberg@adacore.com>
1550         * sem_util.adb (Scope_Within_Or_Same): Handle properly task
1551         bodies and protected bodies, so that local variables within have
1552         their proper scopes after these constructs have been rewritten
1553         during expansion. This patch resembles but is not identical to
1554         the code in Scope_Within.
1556 2019-07-09  Arnaud Charlet  <charlet@adacore.com>
1558         * gnat1drv.adb (Adjust_Global_Switches): Set
1559         Dynamic_Elaboration_Checks to True in CodePeer mode.
1561 2019-07-09  Yannick Moy  <moy@adacore.com>
1563         * sem_spark.adb (Get_Perm_Or_Tree): Issue an error when
1564         encountering unknown global variable.
1566 2019-07-09  Yannick Moy  <moy@adacore.com>
1568         * sem_spark.adb (Check_Expression): Change signature to take an
1569         Extended_Checking_Mode, for handling read permission checking of
1570         sub-expressions in an assignment.
1571         (Check_Parameter_Or_Global): Adapt to new behavior of
1572         Check_Expression for mode Assign.
1573         (Check_Safe_Pointers): Do not analyze generic bodies.
1574         (Check_Assignment): Separate checking of the target of an
1575         assignment.
1577 2019-07-09  Eric Botcazou  <ebotcazou@adacore.com>
1579         * repinfo.ads (JSON format): Adjust.
1580         * repinfo.adb (Need_Blank_Line): Rename to...
1581         (Need_Separator): ...this.
1582         (Blank_Line): Rename to...
1583         (Write_Separator): ...this and add JSON specific handling.
1584         (List_Array_Info): Adjust to above renaming.
1585         (List_Object_Info): Likewise.
1586         (List_Record_Info): Likewise.
1587         (List_Subprogram_Info): Likewise.
1588         (List_Type_Info): Likewise.
1589         (List_Entities): Do not set Need_Blank_Line.
1590         (List_Rep_Info): Set Need_Separator and add JSON specific
1591         handling. Output a single JSON stream in the  normal case.
1593 2019-07-09  Arnaud Charlet  <charlet@adacore.com>
1595         * doc/gnat_ugn/the_gnat_compilation_model.rst: Update doc on
1596         -fdump-ada-spec now that we generate Ada 2012.
1597         * gnat_ugn.texi: Regenerate.
1599 2019-07-08  Eric Botcazou  <ebotcazou@adacore.com>
1601         * repinfo.adb (List_Common_Type_Info): New procedure extracted
1602         from...
1603         (List_Type_Info): ...here.  Call it for the common information,
1604         start with a blank line and output the linker section at the
1605         end, if any.
1606         (List_Mechanisms): Rename to...
1607         (List_Subprogram_Info): ...this.
1608         (List_Array_Info): Call List_Common_Type_Info.
1609         (List_Entities): Adjust to above change and renaming.
1610         (List_Record_Info): Call List_Common_Type_Info.
1612 2019-07-08  Dmitriy Anisimkov  <anisimko@adacore.com>
1614         * libgnat/g-sercom.ads
1615         (Serial_Port_Descriptor): New type.
1616         (Serial_Port): Add a comment, make it hold a
1617         Serial_Port_Descriptor.
1618         (To_Ada, To_C): New procedures.
1619         (Port_Data, Port_Data_Access): Remove types.
1620         * libgnat/g-sercom.adb (To_Ada): New stub.
1621         * libgnat/g-sercom__linux.adb, libgnat/g-sercom__mingw.adb:
1622         Update implementations accordingly.
1623         * s-oscons-tmplt.c: Bind Serial_Port_Descriptor to
1624         System.Win32.HANDLE on Windows, and to Interfaces.C.int on
1625         Linux. Add "Interfaces.C." prefix for other basic integer type
1626         bindings.
1627         * xoscons.adb (Output_Info): Remove the "Interfaces.C." prefix
1628         for subtypes generation.
1630 2019-07-08  Arnaud Charlet  <charlet@adacore.com>
1632         * doc/gnat_rm/standard_and_implementation_defined_restrictions.rst:
1633         Update documentation on No_Exceptions restriction.
1634         * gnat_rm.texi: Regenerate.
1636 2019-07-08  Dmitriy Anisimkov  <anisimko@adacore.com>
1638         * libgnat/s-os_lib.adb: Do not call __gnat_kill for Invalid_Pid.
1640 2019-07-08  Piotr Trojanek  <trojanek@adacore.com>
1642         * sem_util.adb (Enclosing_Package_Or_Subprogram): Do not expect
1643         package and subprogram bodies.
1645 2019-07-08  Bob Duff  <duff@adacore.com>
1647         * doc/gnat_ugn/gnat_utility_programs.rst: Remove documentation
1648         of ignored GNATpp switch.
1650 2019-07-08  Hristian Kirtchev  <kirtchev@adacore.com>
1652         * doc/gnat_rm/implementation_defined_pragmas.rst:
1653         Update the documentation of pragma Initialize_Scalars.
1654         * gnat_rm.texi: Regenerate.
1656 2019-07-08  Javier Miranda  <miranda@adacore.com>
1658         * exp_ch4.adb (Tagged_Membership): Fix regression silently
1659         introduced in r260738 that erroneouslusy causes the evaluation
1660         to True of the membership test when the left operand of the
1661         membership test is a class-wide interface object and the right
1662         operand is a type that implements such interface type.
1664 2019-07-08  Hristian Kirtchev  <kirtchev@adacore.com>
1666         * sem_ch13.adb (Analyze_Attribute_Definition_Clause): Do not
1667         register an address clause when its prefix denotes a generic
1668         formal object.
1670 2019-07-08  Hristian Kirtchev  <kirtchev@adacore.com>
1672         * bindo-diagnostics.adb (Diagnose_Cycle): Capture the presence
1673         of an Elaborate_All edge before iterating over the edges of the
1674         cycle.
1675         (Output_Elaborate_Body_Transition): Update the parameter profile
1676         and the comment on usage. Add a missing case where the edge is
1677         within the context of an Elaborate_All.
1678         (Output_Transition): Update the call to
1679         Output_Elaborate_Body_Transition.
1680         * bindo-graphs.ads, bindo-graphs.adb
1681         (Contains_Elaborate_All_Edge): New routine.
1683 2019-07-08  Piotr Trojanek  <trojanek@adacore.com>
1685         * lib-xref-spark_specific.adb (Create_Heap): Set dummy Etype for
1686         the fake __HEAP entity.
1688 2019-07-08  Daniel Mercier  <mercier@adacore.com>
1690         * gnat1drv.adb: Suppress warnings on memory representation in
1691         CodePeer compiler mode.
1693 2019-07-08  Nicolas Roche  <roche@adacore.com>
1695         * rtinit.c (__gnat_runtime_initialize): Remove dependency on
1696         CommandLineToArgvW.
1698 2019-07-08  Doug Rupp  <rupp@adacore.com>
1700         * Makefile.rtl: Handle vxworks7r2 in x86_64 and x86 vxworks7.
1702 2019-07-08  Dmitriy Anisimkov  <anisimko@adacore.com>
1704         * Makefile.rtl: Use g-sercom__linux.adb for all linuxes.
1706 2019-07-08  Yannick Moy  <moy@adacore.com>
1708         * expander.adb (Expand): Do not reset Analyzed flag always.
1709         * sem_eval.adb (Fold_Ureal): Mark node as analyzed.
1711 2019-07-08  Ed Schonberg  <schonberg@adacore.com>
1713         * exp_ch9.adb (Expand_N_Timed_Entry_Call): Do not insert twice
1714         the assignment statement that computes the delay value, to
1715         prevent improper tree sharing when the value is a type
1716         conversion and Float_Overflow checks are enabled.
1718 2019-07-08  Hristian Kirtchev  <kirtchev@adacore.com>
1720         * bindo.adb: Update the section on terminology to include new
1721         concepts.  Update the section on switches to include new
1722         entries.
1723         * bindo.ads: Add type Precedence_Kind.
1724         * bindo-builders.adb: Add with and use clauses for Debug and
1725         Bindo.Validators.  Add use clauses for
1726         Bindo.Validators.Invocation_Graph_Validators and
1727         Bindo.Validators.Library_Graph_Validators.
1728         (Build_Invocation_Graph): Validate the graph immediately after
1729         it was built.
1730         (Build_Library_Graph): Update the parameter profile. The
1731         creation of the graph is now elaboration model-agnostic.
1732         Validate the graph immediately after it was built.
1733         (Create_With_Edge): Create regular with edges for Elaborate and
1734         Elaborate_All edges when the appropriate debug switches are in
1735         effect.
1736         * bindo-builders.ads (Build_Library_Graph): Update the parameter
1737         profile.
1738         * bindo-diagnostics.adb (Diagnose_Cycle): Track the presence of
1739         an Elaborate_All edge throughout the inspection of the cycle's
1740         edges.
1741         (Output_Dynamic_Model_Suggestions): Output the suggestion only
1742         when the cycle contains at least one weak edge where the
1743         successor was statically elaborated.
1744         (Output_Elaborate_Body_Transition, Output_Forced_Transition,
1745         Output_With_Transition): Update the assertions.
1746         * bindo-elaborators.adb: Remove use clauses for
1747         Bindo.Validators.Invocation_Graph_Validators and
1748         Bindo.Validators.Library_Graph_Validators.  Remove strings
1749         Add_To_All_Candidates_Msg and Add_To_Comp_Candidates_Msg.
1750         Remove type String_Ptr.
1751         (Add_Vertex, Add_Vertex_If_Elaborable, Create_All_Candidates_Set
1752         Create_Component_Candidates_Set): Remove.
1753         (Create_Component_Vertex_Sets, Create_Vertex_Sets): New routine.
1754         (Elaborate_Component): Update the parameter profile and the
1755         comment on usage.  Reimplement the elaboration of a component.
1756         The algorithm will now attempt to elaborate as many vertices
1757         possible. If this is not possible, and a weakly elaborable
1758         vertex is available use unit was compiled using the dynamic
1759         model, the algorithm will elaborate it.
1760         (Elaborate_Library_Graph): Reimplement the elaboration of the
1761         graph. The algorithm will now attempt to elaborate as many
1762         vertices along with their components as possible. If this is not
1763         possible, and a weakly elaborable vertex is available use unit
1764         was compiled using the dynamic model, the algorithm will
1765         elaborate it along with its component.
1766         (Elaborate_Units): Merge with the functionality of
1767         Elaborate_Units_Common.
1768         (Elaborate_Units_Common, Elaborate_Units_Dynamic,
1769         Elaborate_Units_Static): Remove.
1770         (Elaborate_Vertex): Update the parameter profile and the comment
1771         on usage.  Reimplemented.
1772         (Find_Best_Candidate): Remove.
1773         (Find_Best_Elaborable_Vertex, Find_Best_Vertex,
1774         Find_Best_Weakly_Elaborable_Vertex, Has_Elaborable_Body,
1775         Insert_Elaborable_Successor, Insert_Vertex): New routines.
1776         (Is_Better_Candidate): Remove.
1777         (Is_Better_Elaborable_Vertex,
1778         Is_Better_Weakly_Elaborable_Vertex,
1779         Is_Suitable_Elaborable_Vertex,
1780         Is_Suitable_Weakly_Elaborable_Vertex): New routines.
1781         (Trace_Candidate_Vertices): Remove.
1782         (Trace_Component): Output the number of strong and weak
1783         predecessors.
1784         (Trace_Unelaborated_Vertices): Remove.
1785         (Trace_Vertex): Output the number of strong and weak
1786         predecessors.
1787         (Trace_Vertices): New routine.
1788         (Update_Successor, Update_Successors): Update the parameter
1789         profile and the comment on usage.
1790         * bindo-graphs.adb: Remove type Precedence_Kind.
1791         (Add_Edge_With_Return): Update the increment of pending
1792         predecessors.
1793         (Add_Vertex): Provide default values for strong and weak
1794         predecessors.
1795         (Complementary_Vertex): Move the initial declaration to the
1796         spec. Update the parameter profile and the comment on usage.
1797         (Contains_Weak_Static_Successor): New routine.
1798         (Create): Update the parameter profile. The creation of the
1799         graph is now elaboration model-agnostic.
1800         (Decrement_Pending_Predecessors): Update the parameter profile
1801         and the comment on usage. Reimplemented.
1802         (Delete_Edge): Update the decrement of pending predecesors.
1803         (Has_Elaborate_Body): Do not treat a vertex as being subject to
1804         Elaborate_Body when a debug switch is in effect.
1805         (Increment_Pending_Predecessors): Update the parameter profile
1806         and the comment on usage. Reimplemented.
1807         (Is_Elaborable_Component): Reimplemented.
1808         (Is_Elaborable_Vertex): Move the initial declaration to the
1809         spec.  Reimplemented.
1810         (Is_Elaborate_Body_Pair): New routine.
1811         (Is_Dynamically_Elaborated): Update the parameter profile.
1812         Reimplemented.
1813         (Is_Weakly_Elaborable_Vertex): New routine.
1814         (Pending_Predecessors): Removed.
1815         (Pending_Predecessors_For_Elaboration,
1816         Pending_Strong_Predecessors, Pending_Weak_Predecessors,
1817         Update_Pending_Predecessors): New routines.
1818         (Update_Pending_Predecessors_Of_Components): Update the
1819         increment of pending predecessors.
1820         * bindo-graphs.ads: Update the components of type
1821         Component_Attributes.  Update the components of type
1822         Library_Graph_Attributes.  Update the components of type
1823         Library_Graph_Vertex_Attributes.  Update the initialization of
1824         No_Component_Attributes.  Update the initialization of
1825         No_Library_Graph_Vertex_Attributes.
1826         (Complementary_Vertex, Contains_Weak_Static_Successor): New
1827         routines.
1828         (Create): Update the parameter profile and the comment on usage.
1829         (Decrement_Pending_Predecessors, Is_Dynamically_Elaborated):
1830         Update the parameter profile and the comment on usage.
1831         (Is_Elaborate_Body_Pair, Is_Weakly_Elaborable_Vertex): New
1832         routines.
1833         (Pending_Predecessors): Removed.
1834         (Pending_Predecessors_For_Elaboration,
1835         Pending_Strong_Predecessors, Pending_Weak_Predecessors): New
1836         routines.
1837         * bindo-writers.adb (Write_Components): Moved from the spec.
1838         (Write_Component): Output the strong and weak predecessors.
1839         (Write_Library_Graph): Output the components as part of the
1840         graph.
1841         (Write_Library_Graph_Vertex): Output the strong and weak
1842         predecessors.
1843         * bindo-writers.ads (Write_Components): Moved to the body.
1844         * debug.adb: Add and document new GNATbind switches -d_a, -d_b,
1845         -d_e.
1846         * bindo-validators.adb: Minor reformattings.
1848 2019-07-08  Bob Duff  <duff@adacore.com>
1850         * libgnat/g-sercom.ads, libgnat/g-sercom__linux.adb (Data_Rate):
1851         Support additional data rates.
1853 2019-07-08  Olivier Hainque  <hainque@adacore.com>
1855         * gcc-interface/trans.c (Compilation_Unit_to_gnu): Don't request
1856         DECL_ARTIFICIAL_P on elab proc declarations.
1858 2019-07-08  Eric Botcazou  <ebotcazou@adacore.com>
1860         * repinfo.adb (List_Record_Info): Declare Incomplete_Layout and
1861         Not_In_Extended_Main local exceptions.
1862         (List_Structural_Record_Layout): For an extension, raise the
1863         former if the parent subtype has not been built and the latter
1864         if it is not declared in the main source unit.  Fall back to the
1865         flat layout if either exception has been raised.
1867 2019-07-08  Ed Schonberg  <schonberg@adacore.com>
1869         * libgnat/a-strfix.adb (Delete): The RM describes the semantics
1870         of Delete as equivalent to that of Replace_String with a null
1871         argument. As a result, deleting a null string that starts past
1872         the end of its argument is a noop and must not raise
1873         Index_Error.
1875 2019-07-08  Javier Miranda  <miranda@adacore.com>
1877         * exp_disp.adb (Register_Primitive): When registering a
1878         primitive in the secondary dispatch table, handle primitive
1879         inherited through several levels of type derivation (required to
1880         properly handle inherited 'null' primitive).
1882 2019-07-08  Bob Duff  <duff@adacore.com>
1884         * doc/gnat_ugn/gnat_utility_programs.rst: Document handling of
1885         preprocessor directives in GNATpp.
1887 2019-07-08  Javier Miranda  <miranda@adacore.com>
1889         * gnat1drv.adb (Post_Compilation_Validation_Checks:
1890         Validate_Compile_Time_Warning_Errors is now located in sem_prag
1891         (instead of sem_ch13).
1892         * sem_ch13.ads (Validate_Compile_Time_Warning_Error,
1893         Validate_Compile_Time_Warning_Errors): Move to sem_prag.
1894         * sem_ch13.adb
1895         (Compile_Time_Warnings_Errors): Move to sem_prag.
1896         (Initialize): Remove initialization of table
1897         Compile_Time_Warning_Errors.
1898         (Validate_Compile_Time_Warning_Error,
1899         Validate_Compile_Time_Warning_Errors): Move to sem_prag.
1900         * sem_prag.ads (Validate_Compile_Time_Warning_Errors): New
1901         procedure.
1902         * sem_prag.adb (Initialize): Initialize table
1903         Compile_Time_Warning_Errors.
1905 2019-07-08  Ed Schonberg  <schonberg@adacore.com>
1907         * sem_ch13.adb (Analyze_Aspect_Specifications): For a
1908         pre/postcondition of a generic subprogram declaration, do not
1909         use Relocate_Node on the aspect expression to construct the
1910         corresponding attribute specification, to prevent tree anomalies
1911         when the expression is a call with named actual parameters.
1913 2019-07-08  Javier Miranda  <miranda@adacore.com>
1915         * sem_attr.adb (Analyze_Attribute [Attribute_Size]): For pragmas
1916         used to report user defined compile time warning or errors
1917         handle 'Size for types with known static RM size.
1919 2019-07-08  Justin Squirek  <squirek@adacore.com>
1921         * exp_imgv.adb (Build_Enumeration_Image_Tables): Default SSO for
1922         the building of image tables.
1923         (Expand_Image_Attribute): Minor cleanup.
1925 2019-07-08  Dmitriy Anisimkov  <anisimko@adacore.com>
1927         * libgnat/g-socket.ads, libgnat/g-socket.adb: Improve
1928         documentation.
1929         (Get_Socket_Option, Set_Socket_Option): Remove default value for
1930         the Level formal.
1932 2019-07-08  Ed Schonberg  <schonberg@adacore.com>
1934         * sem_ch13.adb (Check_Aspect_At_End_Of_Declarations): For an
1935         unanalized aspect in a generic context that has not been
1936         analyzed yet, if the aspect applies to a type, place the type on
1937         the scope stack to make its components visible, before checking
1938         conformance with the version of the expression analyzed at the
1939         freeze point.
1941 2019-07-05  Justin Squirek  <squirek@adacore.com>
1943         * checks.adb (Apply_Accessibility_Check): Add logic to fetch the
1944         function result accessibility level if one is required within
1945         the generated check.
1946         * exp_ch6.adb (Needs_Result_Accessibility_Level): Modify
1947         controlling elsif block to handle more cases such as anonymous
1948         access results and disable checking for coextensions.
1950 2019-07-05  Ed Schonberg  <schonberg@adacore.com>
1952         * sem_ch9.adb (Analyze_Accept_Statement): If this is an illegal
1953         accept statement for an enclosing entry abandon analysis to
1954         prevent scope mismatches and potential infinite loops in
1955         compiler.
1957 2019-07-05  Hristian Kirtchev  <kirtchev@adacore.com>
1959         * ali.adb (For_Each_Invocation_Construct,
1960         For_Each_Invocation_Relation): New version.
1961         (Scan_ALI): Initialize field Invocation_Graph_Encoding.
1962         (Set_Invocation_Graph_Encoding): Update the setting of the
1963         invocation graph encoding.
1964         * ali.ads: Move field Invocation_Graph_Encoding from Unit_Record
1965         to ALI_Record because the encoding applies to the whole ALI,
1966         rather than one of the units (spec or body) for which the ALI
1967         file was created.
1968         (For_Each_Invocation_Construct, For_Each_Invocation_Relation):
1969         New version.
1970         * bindo.adb: Update the section on switches.  Complete the
1971         section of debugging elaboration order issues.
1972         (Find_Elaboration_Order): Prepare the routine for the switch
1973         from the old to the new elaboration order mechanism.
1974         * bindo-diagnostics.adb (Find_And_Output_Invocation_Paths):
1975         Manage a visited set used by Visit_Vertex.
1976         (Output_All_Cycles_Suggestions,
1977         Output_Dynamic_Model_Suggestions): Clarify the nature of the
1978         suggested switch.
1979         (Output_Elaborate_Body_Transition): Update the diagnostic to
1980         emit a better message.
1981         (Output_Forced_Suggestions, Output_Full_Encoding_Suggestions):
1982         Clarify the nature of the suggested switch.
1983         (Visit_Vertex): Update the parameter profile to add a set of
1984         invokers visited during the transition. This set prevents
1985         infinite exploration of the graph in case the invocations are
1986         recursive.
1987         * bindo-elaborators.adb: Add a use clause for
1988         Bindo.Writers.Dependency_Writers.
1989         (Elaborate_Units_Common): Output the library graph after it has
1990         been augmented with invocation edges. Output just the components
1991         instead of outputting the whole library graph again.
1992         (Elaborate_Units_Dynamic, Elaborate_Units_Static): Output the
1993         dependencies as expressed in the library graph.
1994         * bindo-units.adb (Invocation_Graph_Encoding): Update the
1995         extraction of the invocation graph encoding.
1996         * bindo-writers.adb: Add with and use clauses for Binderr and
1997         Butil.
1998         (palgc, plgc): New debug routine.
1999         (Write_Components): Moved to the spec. Add a header for the
2000         output.
2001         (Write_Dependencies, Write_Dependencies_Of_Vertex,
2002         Write_Dependency_Edge): New routine.
2003         (Write_Elaboration_Order): Update the logic to follow the format
2004         of Binde's order output.
2005         (Write_Library_Graph): Do not output the components every time
2006         the graph is written.
2007         (Write_Unit): Output the invocation graph encoding of the unit.
2008         Output the invocation constructs and relations for the unit
2009         only.
2010         * bindo-writers.ads (Write_Components): Moved from the body.
2011         (Write_Dependencies): New routine.
2012         * bindusg.adb: Prepare the routine for the switch from the old
2013         to the new elaboration order mechanism.
2014         * debug.adb: Binder switch -d_O is now not associated with any
2015         functionality.
2016         * einfo.adb (Is_Elaboration_Target): The attribute applies to
2017         packages, as specified by the comment on the attribute usage.
2018         * opt.ads: Add a global flag which controls the choice between
2019         the new and the legacy elaboration order mechanism.
2020         * sem_elab.adb: Add Package_Target to type Target_Kind.
2021         (Build_Elaborate_Body_Procedure, Build_Elaborate_Procedure,
2022         Build_Elaborate_Spec_Procedure, Check_Elaboration_Scenarios,
2023         Check_SPARK_Model_In_Effect): Use Main_Unit_Entity to obtain the
2024         entity of the main unit.
2025         (Create_Package_Rep): New routine.
2026         (Create_Target_Rep): Add processing for packages.
2027         (Declaration_Placement_Of_Node, Has_Prior_Elaboration): Use
2028         Main_Unit_Entity to obtain the entity of the main
2029          unit.
2030         (Invocation_Graph_Recording_OK): Prepare the routine for the
2031         switch from the old to the new elaboration order mechanism.
2032         (Main_Unit_Entity): New routine.
2033         (Meet_Elaboration_Requirement,
2034         Process_Conditional_ABE_Variable_Reference): Use
2035         Main_Unit_Entity to obtain the entity of the main unit.
2036         (Process_Invocation_Instantiation): New routine.
2037         (Process_Invocation_Scenario): Add processing for
2038         instantiations.
2039         * switch-b.adb (Scan_Binder_Switches): Prepare the routine for
2040         the switch from the old to the new elaboration order mechanism.
2042 2019-07-05  Joffrey Huguet  <huguet@adacore.com>
2044         * libgnat/a-textio.adb: Add abstract state refinment.
2045         * libgnat/a-textio.ads: Add File_System abstract state.  Add
2046         global contracts, contract cases, preconditions and
2047         postconditions to procedures and functions.
2048         (Set_Input, Set_Output, Set_Error, Standard_Input,
2049         Standard_Output, Standard_Error, Current_Input, Current_Output,
2050         Current_Error): Turn SPARK_Mode off.
2051         (Get_Line): Turn SPARK_Mode off on Get_Line functions.
2052         * libgnat/a-tideio.ads, libgnat/a-tienio.ads,
2053         libgnat/a-tifiio.ads, libgnat/a-tiflio.ads,
2054         libgnat/a-tiinio.ads, libgnat/a-timoio.ads: Add global
2055         contracts, contract cases, preconditions and postconditions to
2056         procedures and functions.
2058 2019-07-05  Arnaud Charlet  <charlet@adacore.com>
2060         * doc/gnat_ugn/platform_specific_information.rst: Refresh doc on
2061         installing from the command line on Windows.  Remove obsolete
2062         part.
2063         * gnat_ugn.texi: Regenerate.
2065 2019-07-05  Vasiliy Fofanov  <fofanov@adacore.com>
2067         * libgnat/a-wichha.ads (Is_Alphanumeric): Replace comment with
2068         the correct one.  Also capitalize references to False
2069         throughout.
2071 2019-07-05  Eric Botcazou  <ebotcazou@adacore.com>
2073         * exp_ch4.adb (Expand_N_Indexed_Component): Do not expand actual
2074         parameters of function calls here either.
2076 2019-07-05  Hristian Kirtchev  <kirtchev@adacore.com>
2078         * bindo-units.adb, checks.adb, exp_attr.adb, exp_ch3.adb,
2079         exp_ch4.adb, exp_pakd.adb, lib-writ.adb, libgnat/g-traceb.adb,
2080         libgnat/g-traceb.ads, libgnat/s-stratt.ads, sem_aux.ads,
2081         sem_util.adb: Minor reformatting.
2083 2019-07-05  Ed Schonberg  <schonberg@adacore.com>
2085         * sem_ch13.adb (Build_Predicate_Functions): If a subtype that
2086         carries a static predicate aspect is frozen immediately after
2087         its declaration, ensure that the generated function body created
2088         for predicate checking is inserted after the corresponding
2089         subprogram declaration, which is created at the point the
2090         declaration is elaborated.
2092 2019-07-05  Hristian Kirtchev  <kirtchev@adacore.com>
2094         * exp_ch7.adb (Cleanup_Record): Use the underlying type when
2095         checking for components with tasks.
2097 2019-07-05  Arnaud Charlet  <charlet@adacore.com>
2099         * libgnarl/s-osinte__linux.ads: Link with -lrt before -lpthread.
2101 2019-07-05  Ed Schonberg  <schonberg@adacore.com>
2103         * exp_pakd.adb (Expand_Bit_Packed_Element_Set): Add explicit
2104         range checks when the index type of the bit-packed array is an
2105         enumeration type with a non-standard representation,
2107 2019-07-05  Hristian Kirtchev  <kirtchev@adacore.com>
2109         * sem_res.adb (Is_Control_Flow_Statement): Delay statements
2110         contain an expression, which in turn may have side effects and
2111         affect the infinite recursion. As a result, delay statements
2112         should not be treated specially.
2114 2019-07-05  Arnaud Charlet  <charlet@adacore.com>
2116         * libgnarl/s-linux.ads, libgnarl/s-linux__alpha.ads,
2117         libgnarl/s-linux__android.ads, libgnarl/s-linux__hppa.ads,
2118         libgnarl/s-linux__mips.ads, libgnarl/s-linux__riscv.ads,
2119         libgnarl/s-linux__sparc.ads: Fix typos in comments.
2121 2019-07-05  Hristian Kirtchev  <kirtchev@adacore.com>
2123         * sem_res.adb (Check_Infinite_Recursion): Reimplemented.
2124         (Enclosing_Declaration_Or_Statement,
2125         Invoked_With_Different_Arguments, Is_Conditional_Statement,
2126         Is_Control_Flow_Statement, Is_Immediately_Within_Body,
2127         Is_Raise_Idiom, Is_Raise_Statement, Is_Sole_Statement,
2128         Preceded_By_Control_Flow_Statement,
2129         Within_Conditional_Statement): New routines.
2131 2019-07-05  Javier Miranda  <miranda@adacore.com>
2133         * exp_ch4.adb (Expand_N_Type_Conversion): Do not apply an
2134         accessibility check when the conversion is an access to
2135         class-wide interface type and it is an actual parameter.
2136         * exp_ch6.adb (Expand_Call_Helper): Add documentation on the
2137         accessibility level of an anonymous allocator defining the value
2138         of an access parameter.
2139         * sem_util.ads, sem_util.adb (Dynamic_Accessibility_Level): Add
2140         support for an anonymous allocator whose type is that of a
2141         stand-alone object of an anonymous access to object type.
2143 2019-07-05  Piotr Trojanek  <trojanek@adacore.com>
2145         * einfo.ads, sem_res.adb: Typo fixes in comments.
2147 2019-07-05  Bob Duff  <duff@adacore.com>
2149         * exp_ch6.adb (Is_Build_In_Place_Function): Narrow the check for
2150         Has_Foreign_Convention to the imported case only.  If a
2151         build-in-place function is exported, and called from Ada code,
2152         build-in-place protocols should be used.
2154 2019-07-05  Ed Schonberg  <schonberg@adacore.com>
2156         * sem_util.adb (Encloing_Subprogram): If Enclosing_Dynamic_Scope
2157         is a loop, continue climbing the scope stack to find the
2158         enclosing subprogram.
2159         (Gather_Components): Handle properly a choice in a record
2160         aggregate that is given by a subtype with a static predicate.
2162 2019-07-05  Javier Miranda  <miranda@adacore.com>
2164         * debug.adb (-gnatd.K): Leave available this switch.
2165         * contracts.adb (Build_And_Analyze_Contract_Only_Subprograms):
2166         Remove.
2167         * scil_ll.ads, scil_ll.adb (Contract_Only_Body_Flag,
2168         Contract_Only_Body_Nodes, Get_Contract_Only_Body,
2169         Is_Contract_Only_Body, Set_Contract_Only_Body): Remove.
2171 2019-07-05  Pierre-Marie de Rodat  <derodat@adacore.com>
2173         * libgnat/a-strunb.ads: Import documentation from the RM
2175 2019-07-05  Pierre-Marie de Rodat  <derodat@adacore.com>
2177         * libgnat/a-strfix.ads: Import documentation from the RM
2179 2019-07-05  Yannick Moy  <moy@adacore.com>
2181         * adabkend.adb (Scan_Back_End_Switches): Accept -Og and -Ofast
2182         switches.
2184 2019-07-05  Hristian Kirtchev  <kirtchev@adacore.com>
2186         * ali.adb: Relocate types Invocation_Construct_Record,
2187         Invocation_Relation_Record, and Invocation_Signature_Record to
2188         the body of ALI.  Relocate tables Invocation_Constructs,
2189         Invocation_Relations, and Invocation_Signatures to the body of
2190         ALI.  Remove type Body_Placement_Codes.  Add new types
2191         Declaration_Placement_Codes, and
2192         Invocation_Graph_Encoding_Codes.  Update the literals of type
2193         Invocation_Graph_Line_Codes.
2194         (Add_Invocation_Construct): Update the parameter profile. Add an
2195         invocation construct built from all attributes provided.
2196         (Add_Invocation_Relation): Update the parameter profile. Add an
2197         invocation relation built from all attributes provided.
2198         (Body_Placement): New routine.
2199         (Body_Placement_Kind_To_Code, Code_To_Body_Placement_Kind):
2200         Removed.
2201         (Code_To_Declaration_Placement_Kind,
2202         Code_To_Invocation_Graph_Encoding_Kind, Column,
2203         Declaration_Placement_Kind_To_Code, Extra,
2204         For_Each_Invocation_Construct, For_Each_Invocation_Relation,
2205         Invocation_Graph_Encoding,
2206         Invocation_Graph_Encoding_Kind_To_Code, Invoker, Kind, Line,
2207         Locations, Name): New routine.
2208         (Scan_Invocation_Construct_Line): Reimplement the scanning
2209         mechanism.
2210         (Scan_Invocation_Graph_Attributes_Line): New routine.
2211         (Scan_Invocation_Graph_Line): Use a case statement to dispatch.
2212         (Scan_Invocation_Relation_Line): Reimplement the scanning
2213         mechanism.
2214         (Scope): New routine.
2215         (Set_Invocation_Graph_Encoding, Signature, Spec_Placement,
2216         Target): New routine.
2217         * ali.ads: Add new type Invocation_Graph_Encoding_Kind.  Add
2218         component Invocation_Graph_Encoding to type Unit_Record.
2219         Relocate various types and data structures to the body of ALI.
2220         (Add_Invocation_Construct, Add_Invocation_Relation): Update the
2221         parameter profile.
2222         (Body_Placement): New routine.
2223         (Body_Placement_Kind_To_Code, Code_To_Body_Placement_Kind):
2224         Removed.
2225         (Code_To_Declaration_Placement_Kind,
2226         Code_To_Invocation_Graph_Encoding_Kind, Column,
2227         Declaration_Placement_Kind_To_Code, Extra,
2228         For_Each_Invocation_Construct, For_Each_Invocation_Relation,
2229         Invocation_Graph_Encoding,
2230         Invocation_Graph_Encoding_Kind_To_Code, Invoker, Kind, Line,
2231         Locations, Name, Scope, Set_Invocation_Graph_Encoding,
2232         Signature, Spec_Placement, Target): New routine.
2233         * bindo.adb: Add with clause for Binde.  Add with and use
2234         clauses for Debug.  Update the documentation.  Add new switches.
2235         (Find_Elaboration_Order): Dispatch to the proper elaboration
2236         mechanism.
2237         * bindo-augmentors.adb:
2238         Remove with and use clauses for GNAT and GNAT.Sets.  Remove
2239         membership set VS.  Update the parameter profiles of most
2240         routines to use better parameter names.  Update the
2241         implementation of most routine to use the new parameter names.
2242         Remove various redundant assertions.
2243         * bindo-builders.adb: Use better names for instantiated data
2244         structures. Update all references to these names.  Update the
2245         parameter profiles of most routines to use better parameter
2246         names.  Update the implementation of most routine to use the new
2247         parameter names.
2248         (Build_Library_Graph): Update the parameter profile. Update the
2249         call to Create.
2250         (Create_Vertex): Reimplemented.
2251         (Declaration_Placement_Vertex): New routine.
2252         * bindo-builders.ads (Build_Library_Graph): Update the parameter
2253         profile and comment on usage.
2254         * bindo-diagnostics.adb: Almost a new unit.
2255         * bindo-diagnostics.ads: Add a use clause for
2256         Bindo.Graphs.Invocation_Graphs.  Remove package
2257         Cycle_Diagnostics.
2258         (Diagnose_Circularities): New routine.
2259         * bindo-elaborators.adb: Remove the with and use clauses for
2260         Binderr and GNAT.Sets.  Remove the use clause for
2261         Bindo.Diagnostics.Cycle_Diagnostics.  Remove membership set VS.
2262         Update the parameter profiles of most routines to use better
2263         parameter names.  Update the implementation of most routine to
2264         use the new parameter names.  (Elaborate_Units_Common): Update
2265         the parameter profile. Pass an infication to the library graph
2266         builder whether the dynamic model is in effect.
2267         (Elaborate_Units_Dynamic, Elaborate_Units_Static): Use
2268         Diagnose_Circularities to provide diagnostics.
2269         (Update_Successor): Use routine In_Same_Component to determine
2270         whether the predecessor and successor reside in different
2271         components.
2272         * bindo-graphs.adb: Add with and use clauses for Butil, Debug,
2273         Output, and Bindo.Writers.  Remove with and use clauses for
2274         GNAT.Lists.  Update the parameter profiles of most routines to
2275         use better parameter names.  Update the implementation of most
2276         routine to use the new parameter names.  Remove various
2277         redundant assertions.  Remove doubly linked list EL.  Add new
2278         type Precedence_Kind.
2279         (Add_Cycle): New routine.
2280         (Add_Vertex): Update the parameter profile. Update the creation
2281         of vertex attributes.
2282         (Add_Vertex_And_Complement, Body_Vertex, Column,
2283         Complementary_Vertex, Copy_Cycle_Path, Cycle_Kind_Of): New
2284         routines.
2285         (Destroy_Invocation_Graph_Edge, Destroy_Library_Graph_Cycle,
2286         Destroy_Library_Graph_Edge, Extra, File_Name,
2287         Find_All_Cycles_Through_Vertex, Find_All_Cycles_With_Edge,
2288         Find_Cycles, Find_First_Lower_Precedence_Cycle,
2289         Get_LGC_Attributes, Has_Next, Hash_Library_Graph_Cycle,
2290         Hash_Library_Graph_Cycle_Attributes, Highest_Precedence_Cycle,
2291         Highest_Precedence_Edge, In_Same_Component, Insert_And_Sort,
2292         Invocation_Edge_Count, Invocation_Graph_Encoding,
2293         Is_Cycle_Initiating_Edge, Is_Cyclic_Edge,
2294         Is_Cyclic_Elaborate_All_Edge, Is_Cyclic_Elaborate_Body_Edge,
2295         Is_Cyclic_Elaborate_Edge, Is_Cyclic_Forced_Edge,
2296         Is_Cyclic_Invocation_Edge, Is_Cyclic_With_Edge,
2297         Is_Dynamically_Elaborated, Is_Elaborate_All_Edge,
2298         Is_Elaborate_Body_Edge, Is_Elaborate_Edge: New routines.
2299         (Is_Existing_Predecessor_Successor_Relation): Removed.
2300         (Is_Forced_Edge, Is_Invocation_Edge, Is_Recorded_Cycle,
2301         Is_Recorded_Edge, Is_With_Edge, Iterate_Edges_Of_Cycle, Kind,
2302         Length): New routine.
2303         (Lib_Vertex): Removed.
2304         (Line, Links_Vertices_In_Same_Component,
2305         Maximum_Invocation_Edge_Count, Next, Normalize_And_Add_Cycle,
2306         Normalize_Cycle_Path, Number_Of_Cycles, Path, Precedence,
2307         Remove_Vertex_And_Complement, Sequence_Next_Cycle): New routines.
2308         (Sequence_Next_IGE_Id): Renamed to Sequence_Next_Edge.
2309         (Sequence_Next_IGV_Id): Renamed to Sequence_Next_Vertex.
2310         (Sequence_Next_LGE_Id): Renamed to Sequence_Next_Edge.
2311         (Sequence_Next_LGV_Id): Renamed to Sequence_Next_Vertex.
2312         (Set_Is_Existing_Predecessor_Successor_Relation): Removed.
2313         (Set_Is_Recorded_Cycle, Set_Is_Recorded_Edge,
2314         Set_LGC_Attributes, Spec_Vertex, Trace_Cycle, Trace_Edge,
2315         Trace_Eol, Trace_Vertex): New routines.
2316         * bindo-graphs.ads: Add with and use clauses for Types and
2317         GNAT.Lists.  Update the parameter profiles of most routines to
2318         use better parameter names.  Update the implementation of most
2319         routine to use the new parameter names.  Add the new
2320         instantiated data structures IGE_Lists, IGV_Sets, LGC_Lists,
2321         LGE_Lists, LGE_Sets, LGV_Sets, and RC_Sets.  Add new type
2322         Library_Graph_Cycle_Id along with an empty and initial value.
2323         Remove component Lib_Vertex and add new components Body_Vertex
2324         and Spec_Vertex to type Invocation_Graph_Vertex_Attributes.  Add
2325         new type Library_Graph_Cycle_Kind.  Add new iterators
2326         All_Cycle_Iterator and Edges_Of_Cycle_Iterator.  Add new type
2327         Library_Graph_Cycle_Attributes.  Add new components
2328         Cycle_Attributes, Cycles, and Dynamically_Elaborated to type
2329         Library_Graph_Attributes.
2330         (Body_Vertex, Column, Destroy_Invocation_Graph_Edge,
2331         Destroy_Library_Graph_Cycle_Attributes,
2332         Destroy_Library_Graph_Edge, Extra, File_Name, Find_Cycles,
2333         Has_Elaborate_All_Cycle, Has_Next, Hash_Library_Graph_Cycle,
2334         Hash_Library_Graph_Cycle_Attributes, Highest_Precedence_Cycle,
2335         In_Same_Component, Invocation_Edge_Count,
2336         Invocation_Graph_Encoding, Is_Dynamically_Elaborated,
2337         Is_Elaborate_All_Edge, Is_Elaborate_Body_Edge,
2338         Is_Elaborate_Edge, Is_Forced_Edge, Is_Invocation_Edge,
2339         Is_With_Edge, Iterate_All_Cycles, Iterate_Edges_Of_Cycle, Kind):
2340         New routines.
2341         (Length, Lib_Vertex, (Line, Next, Number_Of_Cycles, Present,
2342         Same_Library_Graph_Cycle_Attributes, Spec_Vertex): New routines.
2343         * bindo-units.adb (File_Name, Invocation_Graph_Encoding): New
2344         routines.
2345         * bindo-units.ads: Add new instantiated data structure
2346         Unit_Sets.
2347         (File_Name, Invocation_Graph_Encoding): New routine.
2348         * bindo-validators.adb: Remove with and use clauses for GNAT and
2349         GNAT.Sets.  Remove membership set US.  Update the parameter
2350         profiles of most routines to use better parameter names.  Update
2351         the implementation of most routine to use the new parameter
2352         names.
2353         (Validate_Cycle, Validate_Cycle_Path, Validate_Cycles,
2354         Validate_Invocation_Graph_Vertex): Remove the validation of
2355         component Lib_Vertex. Add the validation of components
2356         Body_Vertex and Spec_Vertex.
2357         (Write_Error): New routine.
2358         * bindo-validators.ads (Validate_Cycles): New routine.
2359         * bindo-writers.adb: Update the parameter profiles of most
2360         routines to use better parameter names.  Update the
2361         implementation of most routine to use the new parameter names.
2362         (Write_Cycle, Write_Cyclic_Edge, Write_Cycles): New routines.
2363         (Write_Invocation_Graph_Vertex): Remove the output of component
2364         Lib_Vertex. Add the output of components Body_Vertex and
2365         Spec_Vertex.
2366         * bindo-writers.ads (Write_Cycles): New routine.
2367         * debug.adb: Use binder switches -d_C and -d_P, add
2368         documentation on their usage.
2369         * gnatbind.adb: Remove with and use clauses for Binde.  Delegate
2370         the choice of elaboration mechanism to Bindo.
2371         * lib-writ.adb (Column, Extra, Invoker, Kind, Line, Locations,
2372         Name, Placement, Scope, Signature, Target): Removed.
2373         (Write_Invocation_Graph): Moved at the top level.
2374         (Write_Invocation_Graph_Attributes): New routine.
2375         (Write_Invocation_Relation, Write_Invocation_Signature): Moved
2376         at the top level.
2377         * lib-writ.ads: Add a documentation section on invocation graph
2378         attributes.
2379         * sem_elab.adb (Body_Placement_Of): New routine.
2380         (Declare_Invocation_Construct): Update the call to
2381         Add_Invocation_Construct.
2382         (Declaration_Placement_Of_Node): New routine.
2383         (Get_Invocation_Attributes): Correct the retrieval of the
2384         enclosing subprogram where the postcondition procedure lives.
2385         (Placement_Of, Placement_Of_Node): Removed.
2386         (Record_Invocation_Graph): Record the encoding format used.
2387         (Record_Invocation_Graph_Encoding): New routine.
2388         (Record_Invocation_Relation): Update the call to
2389         Add_Invocation_Relation.
2390         (Spec_Placement_Of): Removed.
2391         * libgnat/g-lists.ads, libgnat/g-lists.adb (Equal): New routine.
2393 2019-07-05  Ed Schonberg  <schonberg@adacore.com>
2395         * checks.adb (Apply_Predicate_Check): Except within the
2396         subprogram body that defines the formal, do not apply predicate
2397         check on a formal IN parameter: such a check is redundant and
2398         its expansion can lead to out-of-scope references when it is
2399         originates in a function call in a precondition,
2401 2019-07-05  Yannick Moy  <moy@adacore.com>
2403         * sem_res.adb (Resolve_Call): Cannot inline in quantified
2404         expressions.
2405         * sem_util.adb, sem_util.ads (In_Quantified_Expression): New
2406         function.
2408 2019-07-05  Bob Duff  <duff@adacore.com>
2410         * doc/gnat_rm/standard_and_implementation_defined_restrictions.rst:
2411         Fix typo.
2412         * gnat_rm.texi: Regenerate.
2414 2019-07-05  Bob Duff  <duff@adacore.com>
2416         * exp_attr.adb (Input): Take the No_Stream_Optimizations
2417         restriction into account.
2419 2019-07-05  Claire Dross  <dross@adacore.com>
2421         * libgnat/a-cofove.ads, libgnat/a-cofove.adb: Definite formal
2422         vectors are now always bounded so that they do not need to be
2423         limited anymore.
2425 2019-07-05  Dmitriy Anisimkov  <anisimko@adacore.com>
2427         * libgnat/g-traceb.ads, libgnat/g-traceb.adb (Call_Chain): New
2428         function.
2430 2019-07-04  James Clarke  <jrtc27@debian.org>
2432         * libgnarl/s-osinte__kfreebsd-gnu.ads (clockid_t): Make type
2433         definition public.
2434         (CLOCK_REALTIME): Make value public.
2436 2019-07-04  Javier Miranda  <miranda@adacore.com>
2438         * exp_tss.adb (Init_Proc): Adding missing support for access to
2439         subprograms and access to protected subprograms of non-default
2440         C++ constructors.
2442 2019-07-04  Eric Botcazou  <ebotcazou@adacore.com>
2444         * gnat1drv.adb (Adjust_Global_Switches): Use proper interface to
2445         set the validity settings in CodePeer mode.
2446         * par-load.adb (Load): Remove all code dealing with validity
2447         settings.
2448         * validsw.ads (Validity_Check_Copies): Alphabetize.
2449         * validsw.adb (Reset_Validity_Check_Options): Set all options to
2450         off.
2451         (Save_Validity_Check_Options): Save all options.
2453 2019-07-04  Hristian Kirtchev  <kirtchev@adacore.com>
2455         * exp_ch3.adb, exp_ch4.adb, exp_ch4.ads, exp_ch5.adb,
2456         exp_ch7.adb, exp_ch9.adb, exp_ch11.adb, exp_unst.adb,
2457         rtsfind.ads, sem_attr.adb, sem_ch10.adb, sem_ch12.adb,
2458         sem_ch13.adb, sem_dim.adb, sem_disp.adb, xref_lib.adb: Minor
2459         reformatting.
2461 2019-07-04  Joffrey Huguet  <huguet@adacore.com>
2463         * libgnarl/a-taside.ads: Add assertion policy to ignore
2464         preconditions.
2465         (Abort_Task, Is_Terminated, Is_Callable): Add preconditions.
2467 2019-07-04  Eric Botcazou  <ebotcazou@adacore.com>
2469         * doc/gnat_rm/implementation_defined_pragmas.rst: Fix
2470         capitalization and parenthesis glitches.
2471         * gnat_rm.texi: Regenerate.
2473 2019-07-04  Ed Schonberg  <schonberg@adacore.com>
2475         * sem_ch10.adb (Remove_Context_Clauses): Handle properly the
2476         removal of a limited_with_clause which appears in the library
2477         unit oF the main unit, when some other unit in the context has a
2478         regular with_clause on the same unit, to prevent spurious
2479         visibility errors in the subsequent analysis of pending instance
2480         bodies.
2482 2019-07-04  Hristian Kirtchev  <kirtchev@adacore.com>
2484         * sem_elab.adb: Add new type Elaboration_Phase_Status along with
2485         a global to keep track of the elaboration phase status.
2486         Initialize all internal data structures to Nil for services
2487         Elaborated_Units, Internal_Representation, and Scenario_Storage.
2488         (Build_Call_Marker): Do not create a call marker when the
2489         elaboration phase is not active.
2490         (Build_Variable_Reference_Marker): Do not create a call marker
2491         when the elaboration phase is not active.
2492         (Check_Elaboration_Scenarios): Destroy all internal structures
2493         when the elaboration phase does not have to run. Do not execute
2494         when the elaboration phase is not active.
2495         (Elaboration_Phase_Active): New routine.
2496         (Finalize_All_Data_Structures): New routine.
2497         (Initialize): Initialize all internal data structures and signal
2498         that the elaboration phase has started.
2499         (Initialize_All_Data_Structures): New routine.
2500         (Initialize_Elaborated_Units): Initialize all internal data
2501         structures.
2502         (Initialize_Internal_Representation): Initialize all internal
2503         data structures.
2504         (Initialize_Scenario_Storage): Initialize all internal data
2505         structures.
2506         (Kill_Elaboration_Scenario): Do not execute when the elaboration
2507         phase is not active.
2508         (Set_Elaboration_Phase): New routine.
2509         (Update_Elaboration_Scenario): Do not execute when the
2510         elaboration phase is not active.
2512 2019-07-04  Gary Dismukes  <dismukes@adacore.com>
2514         * sem_ch6.adb (Analyze_Subprogram_Body_Helper): The special
2515         treatment of calling Mask_Unfrozen_Types must also be done in
2516         the case of an Ignored_Ghost_Entity, because Expander_Active is
2517         False in that case.
2519 2019-07-04  Yannick Moy  <moy@adacore.com>
2521         * sem_prag.adb (Check_Library_Level_Entity): Update for new rule
2522         on SPARK_Mode.
2524 2019-07-04  Justin Squirek  <squirek@adacore.com>
2526         * sem_disp.adb (Check_Controlling_Formals): Obtain the full view
2527         before type comparison.
2529 2019-07-04  Ed Schonberg  <schonberg@adacore.com>
2531         * exp_ch4.ads, exp_ch4.adb (Build_Eq_Call): New visible
2532         subprogram, extracted from Expand_Composite_Equality, to handle
2533         properly the composition of equality for variant record types.
2534         * exp_ch3.adb (MAke_Eq_If): Use Build_Eq_Call for each
2535         component, to handle properly the case of a component with a
2536         user-defined equality. Revert to predefined equality if the
2537         user-defined operation is abstract, to maintain compatibility
2538         with older versions,
2540 2019-07-04  Justin Squirek  <squirek@adacore.com>
2542         * exp_ch3.adb (Build_Initialization_Call): Fixup
2543         *_skip_null_excluding_check argument to handle new default.
2544         (Init_Formals): Make *_skip_null_excluding_check formal default
2545         to False
2546         * exp_ch4.adb (Expand_N_Allocator): Add comment to note heavy
2547         code duplication
2549 2019-07-04  Bob Duff  <duff@adacore.com>
2551         * sem_ch3.adb (Access_Definition): Do not create a master unless
2552         Tasking_Allowed. Otherwise, this fails on restricted runtimes.
2554 2019-07-04  Hristian Kirtchev  <kirtchev@adacore.com>
2556         * sem_util.adb (Propagate_DIC_Attributes): Do not propagate the
2557         Default_Initial_Condition attributes to an incomplete type.
2559 2019-07-04  Ed Schonberg  <schonberg@adacore.com>
2561         * sem_attr.adb (Check_Array_Type): An array type attribute such
2562         as 'First can be applied to an unconstrained array tyope when
2563         the attribute reference appears within an aspect specification
2564         and the prefix is a current instance, given that the prefix of
2565         the attribute will become a formal of the subprogram that
2566         implements the aspect (typically a predicate check).
2568 2019-07-04  Piotr Trojanek  <trojanek@adacore.com>
2570         * sem_util.adb (Yields_Synchronized_Object): Fix typos in
2571         comments.
2573 2019-07-04  Yannick Moy  <moy@adacore.com>
2575         * sem_util.adb (Yields_Synchronized_Object): Adapt to new SPARK
2576         rule.
2578 2019-07-04  Yannick Moy  <moy@adacore.com>
2580         * sem_spark.adb (Check_Statement): Only check permission of
2581         object in extended return when it is of a deep type.
2583 2019-07-04  Justin Squirek  <squirek@adacore.com>
2585         * sem_ch12.adb (Perform_Appropriate_Analysis): Added for
2586         selecting which type of analysis based on wheither the
2587         instantiation is a generic at the library-level. In which case
2588         expansion during analysis.
2589         (Preanalyze_Actuals): Modify calls to Analyze to use the new
2590         routine.
2592 2019-07-04  Ed Schonberg  <schonberg@adacore.com>
2594         * exp_unst.adb: Handle conditional expressions.
2596 2019-07-04  Yannick Moy  <moy@adacore.com>
2598         * sem_spark.adb (Check_Package_Spec, Check_Package_Body): Only
2599         analyze parts of the code marked in SPARK.
2601 2019-07-04  Hristian Kirtchev  <kirtchev@adacore.com>
2603         * erroutc.adb, exp_aggr.adb, inline.adb, opt.adb, sem_ch3.adb:
2604         Minor reformatting.
2606 2019-07-04  Yannick Moy  <moy@adacore.com>
2608         * sem_spark.adb (Explanation, Get_Expl): New functions to get
2609         the explanation for a permission mismatch.
2610         (Perm_Error, Perm_Mismatch, Perm_Error_Loop_Exit): Take
2611         explanation into account for issuing a more precise error
2612         message.
2613         (Set_Perm_Prefixes, Set_Perm_Extensions,
2614         Set_Perm_Extensions_Move): Pass suitable argument for the
2615         explanation node.
2617 2019-07-04  Arnaud Charlet  <charlet@adacore.com>
2619         * exp_aggr.adb (In_Place_Assign_OK): Moved to top level and add
2620         support for record aggregates.
2621         (Component_Check): Use Is_CCG_Supported_Aggregate instead of a
2622         similar local predicate.
2623         (Convert_To_Assignments): Take advantage of In_Place_Assign_OK
2624         predicate when possible.
2625         (Is_CCG_Supported_Aggregate): Return False for records with
2626         representation clauses and fix the logic for dealing with nested
2627         aggregates.
2629 2019-07-04  Piotr Trojanek  <trojanek@adacore.com>
2631         * opt.adb (Set_Config_Switches): Keep assertions policy as
2632         enabled when analysing internal units in GNATprove mode.
2634 2019-07-04  Arnaud Charlet  <charlet@adacore.com>
2636         * exp_ch4.adb (Expand_Short_Circuit_Operator): Strip
2637         N_Variable_Reference_Marker when checking for the presence of
2638         actions.
2640 2019-07-04  Arnaud Charlet  <charlet@adacore.com>
2642         * exp_aggr.adb (Check_Component): Take into account type
2643         conversions.
2645 2019-07-04  Dmitriy Anisimkov  <anisimko@adacore.com>
2647         * doc/gnat_ugn/platform_specific_information.rst: Document
2648         Windows socket timeout particularity.
2649         * gnat_ugn.texi: Regenerate.
2650         * gsocket.h: Include versionhelpers.h.
2651         * socket.c (__gnat_minus_500ms): New function.
2652         * libgnat/g-sothco.ads (Minus_500ms_Windows_Timeout): New
2653         imported function.
2654         * libgnat/g-socket.adb (Set_Socket_Option): Refactor to remove
2655         500ms from the requested timeout only on old Windows version.
2657 2019-07-04  Thomas Quinot  <quinot@adacore.com>
2659         * get_scos.adb: Remove bogus, dead code.
2661 2019-07-04  Ed Schonberg  <schonberg@adacore.com>
2663         * sem_dim.adb (Analyze_Dimension_Array_Aggregate): If the
2664         component is an entity name, its dimensions are those of its
2665         type.
2667 2019-07-03  Bob Duff  <duff@adacore.com>
2669         * doc/gnat_ugn/gnat_utility_programs.rst: Document new flags in
2670         GNATpp.
2672 2019-07-03  Hristian Kirtchev  <kirtchev@adacore.com>
2674         * binde.adb: Remove with clause for System.OS_Lib.
2675         (Force_Elab_Order): Refactor the majority of the code in Butil.
2676         Use the new forced units iterator to obtain unit names.
2677         * bindo-builders.adb: Add with and use clauses for Binderr,
2678         Butil, Opt, Output, Types, GNAT, and GNAT.Dynamic_HTables.  Add
2679         a hash table which maps units to line number in the forced
2680         elaboration order file.
2681         (Add_Unit): New routine.
2682         (Build_Library_Graph): Create forced edges between pairs of
2683         units listed in the forced elaboration order file.
2684         (Create_Forced_Edge, Create_Forced_Edges, Destroy_Line_Number,
2685         Duplicate_Unit_Error, Hash_Unit, Internal_Unit_Info,
2686         Is_Duplicate_Unit, Missing_Unit_Info): New routines.
2687         * bindo-graphs.adb (Is_Internal_Unit, Is_Predefined_Unit):
2688         Refactor some of the behavior to Bindo-Units.
2689         * bindo-graphs.ads: Enable the enumeration literal for forced
2690         edges.
2691         * bindo-units.adb, bindo-units.ads (Is_Internal_Unit,
2692         Is_Predefined_Unit): New routines.
2693         * butil.adb: Add with and use clauses for Opt, GNAT, and
2694         System.OS_Lib.  Add with clause for Unchecked_Deallocation.
2695         (Has_Next, Iterate_Forced_Units, Next, Parse_Next_Unit_Name,
2696         Read_Forced_Elab_Order_File): New routines.
2697         * butil.ads: Add with and use clauses for Types.  Add new
2698         iterator over the units listed in the forced elaboration order
2699         file.
2700         (Has_Next, Iterate_Forced_Units, Next): New routine.
2701         * namet.adb, namet.ads (Present): New routine.
2703 2019-07-03  Bob Duff  <duff@adacore.com>
2705         * sem_ch3.adb (Access_Definition): The code was creating a
2706         master in the case where the designated type is a class-wide
2707         interface type. Create a master in the noninterface case as
2708         well. That is, create a master for all limited class-wide types.
2710 2019-07-03  Yannick Moy  <moy@adacore.com>
2712         * erroutc.adb (Sloc_In_Range): New function to determine whether
2713         the range of a pragma Warnings covers a location, taking
2714         instantiations into account.
2716 2019-07-03  Johannes Kanig  <kanig@adacore.com>
2718         * osint.ads, osint.adb (Get_First_Main_File_Name): New routine
2719         to access the first file provided on the command line.
2721 2019-07-03  Ed Schonberg  <schonberg@adacore.com>
2723         * inline.adb (Process_Formals_In_Aspects): New procedure within
2724         Expand_Inlined_Call, to perform a replacement of references to
2725         formals that appear in aspect specifications within the body
2726         being inlined.
2728 2019-07-03  Justin Squirek  <squirek@adacore.com>
2730         * sem_ch8.adb (Analyze_Object_Renaming): Add call to search for
2731         the appropriate actual subtype of the object renaming being
2732         analyzed.
2733         (Check_Constrained_Object): Minor cleanup.
2735 2019-07-03  Yannick Moy  <moy@adacore.com>
2737         * sem_spark.adb (Get_Observed_Or_Borrowed_Expr): New function to
2738         return go through traversal function call.
2739         (Check_Type): Consistently use underlying type.
2740         (Get_Perm): Adapt for case of elaboration code where variables
2741         are not declared in the environment. Remove incorrect handling
2742         of borrow and observe.
2744 2019-07-03  Hristian Kirtchev  <kirtchev@adacore.com>
2746         * inline.adb (Build_Return_Object_Formal): New routine.
2747         (Can_Split_Unconstrained_Function): Code clean up.
2748         (Copy_Formals,Copy_Return_Object): New routines.
2749         (Split_Unconstrained_Function): Code clean up and refactoring.
2751 2019-07-03  Gary Dismukes  <dismukes@adacore.com>
2753         * bindo-augmentors.adb, bindo-augmentors.ads,
2754         bindo-builders.ads, bindo-elaborators.adb, sem_ch12.adb,
2755         sem_ch13.adb, sem_spark.adb, sinfo.ads: Minor editorial
2756         corrections and reformatting.
2758 2019-07-03  Bob Duff  <duff@adacore.com>
2760         * sem_warn.adb (Check_Infinite_Loop_Warning): Avoid the warning
2761         if an Iterator_Specification is present.
2763 2019-07-03  Bob Duff  <duff@adacore.com>
2765         * doc/gnat_ugn/gnat_utility_programs.rst: Document default
2766         new-line behavior.
2768 2019-07-03  Hristian Kirtchev  <kirtchev@adacore.com>
2770         * ali.adb: Add with and use clauses for GNAT,
2771         GNAT.Dynamic_HTables, and Snames.  Add a map from invocation
2772         signature records to invocation signature ids.  Add various
2773         encodings of invocation-related attributes.  Sort and update
2774         table Known_ALI_Lines.
2775         (Add_Invocation_Construct, Add_Invocation_Relation,
2776         Body_Placement_Kind_To_Code, Code_To_Body_Placement_Kind,
2777         Code_To_Invocation_Construct_Kind, Code_To_Invocation_Kind,
2778         Code_To_Invocation_Graph_Line_Kind, Destroy, Hash): New
2779         routines.
2780         (Initialize_ALI): Sort the initialization sequence. Add
2781         initialization for all invocation-related tables.
2782         (Invocation_Construct_Kind_To_Code,
2783         Invocation_Graph_Line_Kind_To_Code, Invocation_Kind_To_Code,
2784         Invocation_Signature_Of, Present): New routines.
2785         (Scan_ALI): Add the default values for invocation-related ids.
2786         Scan invocation graph lines.
2787         (Scan_Invocation_Graph_Line): New routine.
2788         * ali.ads: Add with clause for GNAT.Dynamic_Tables.  Add types
2789         for invocation constructs, relations, and signatures.  Add
2790         tables for invocation constructs, relations, and signatures.
2791         Update Unit_Record to capture invocation-related ids.  Relocate
2792         table Unit_Id_Tables and subtypes Unit_Id_Table, Unit_Id_Array
2793         from Binde.
2794         (Add_Invocation_Construct, Add_Invocation_Relation,
2795         Body_Placement_Kind_To_Code, Code_To_Body_Placement_Kind,
2796         Code_To_Invocation_Construct_Kind, Code_To_Invocation_Kind,
2797         Code_To_Invocation_Graph_Line_Kind,
2798         Invocation_Construct_Kind_To_Code,
2799         Invocation_Graph_Line_Kind_To_Code, Invocation_Kind_To_Code,
2800         Invocation_Signature_Of, Present): New routines.
2801         * binde.adb: Add with and use clause for Types.  Add use clause
2802         for ALI.Unit_Id_Tables;
2803         * binde.ads: Relocate table Unit_Id_Tables and subtypes
2804         Unit_Id_Table, Unit_Id_Array to ALI.
2805         * bindgen.adb: Remove with and use clause for ALI.
2806         * bindgen.ads: Remove with and use clause for Binde.  Add with
2807         and use clause for ALI.
2808         * bindo.adb,  bindo.ads, bindo-augmentors.adb,
2809         bindo-augmentors.ads, bindo-builders.adb, bindo-builders.ads,
2810         bindo-diagnostics.adb, bindo-diagnostics.ads,
2811         bindo-elaborators.adb, bindo-elaborators.ads, bindo-graphs.adb,
2812         bindo-graphs.ads, bindo-units.adb, bindo-units.ads,
2813         bindo-validators.adb, bindo-validators.ads, bindo-writers.adb,
2814         bindo-writers.ads: New units.
2815         * debug.adb: Use and describe GNAT debug switches -gnatd_F and
2816         -gnatd_G.  Add GNATbind debug switches in the ranges dA .. dZ,
2817         d.a .. d.z, d.A .. d.Z, d.1 .. d.9, d_a .. d_z, d_A .. d_Z, and
2818         d_1 .. d_9.  Use and describe GNATbind debug switches -d_A,
2819         -d_I, -d_L, -d_N, -d_O, -d_T, and -d_V.
2820         * exp_util.adb, exp_util.ads (Exceptions_OK): Relocate to
2821         Sem_Util.
2822         * gnatbind.adb: Add with and use clause for Bindo.  Use the new
2823         Bindo elaboration order only when -d_N is in effect.
2824         * lib-writ.adb
2825         (Column, Extra, Invoker, Kind, Line, Locations, Name, Placement,
2826         Scope, Signature, Target): New routines.
2827         (Write_ALI): Output all invocation-related data.
2828         (Write_Invocation_Graph): New routine.
2829         * lib-writ.ads: Document the invocation graph ALI line.
2830         * namet.adb, namet.ads (Present): New routines.
2831         * sem_ch8.adb (Find_Direct_Name): Capture the status of
2832         elaboration checks and warnings of an identifier.
2833         (Find_Expanded_Name): Capture the status of elaboration checks
2834         and warnings of an expanded name.
2835         * sem_ch12.adb (Analyze_Generic_Package_Declaration): Ensure
2836         that invocation graph-related data within the body of the main
2837         unit is encoded in the ALI file.
2838         (Analyze_Generic_Subprogram_Declaration): Ensure that invocation
2839         graph-related data within the body of the main unit is encoded
2840         in the ALI file.
2841         (Analyze_Package_Instantiation): Perform minimal decoration of
2842         the instance entity.
2843         (Analyze_Subprogram_Instantiation): Perform minimal decoration
2844         of the instance entity.
2845         * sem_elab.adb: Perform heavy refactoring of all code. The unit
2846         is now split into "services" which specialize in one area of ABE
2847         checks.  Add processing in order to capture invocation-graph
2848         related attributes of the main unit, and encode them in the ALI
2849         file.  The Processing phase can now operate in multiple modes,
2850         all described by type Processing_Kind.  Scenarios and targets
2851         are now distinct at the higher level, and carry their own
2852         representations. This eliminates the need to constantly
2853         recompute their attributes, and offers the various processors a
2854         uniform interface.  The various initial states of the Processing
2855         phase are now encoded using type Processing_In_State, and
2856         xxx_State constants.
2857         * sem_elab.ads: Update the literals of type
2858         Enclosing_Level_Kind.  Add Inline pragmas on several routines.
2859         * sem_prag.adb (Process_Inline): Ensure that invocation
2860         graph-related data within the body of the main unit is encoded
2861         in the ALI file.
2862         * sem_util.adb (Enclosing_Generic_Body, Enclosing_Generic_Unit):
2863         Code clean up.
2864         (Exceptions_OK): Relocated from Sem_Util.
2865         (Mark_Save_Invocation_Graph_Of_Body): New routine.
2866         * sem_util.ads (Exceptions_OK): Relocated from Sem_Util.
2867         (Mark_Save_Invocation_Graph_Of_Body): New routine.
2868         * sinfo.adb (Is_Elaboration_Checks_OK_Node): Now applicable to
2869         N_Variable_Reference_Marker.
2870         (Is_Elaboration_Warnings_OK_Node): Now applicable to
2871         N_Expanded_Name, N_Identifier, N_Variable_Reference_Marker.
2872         (Is_Read): Use Flag4.
2873         (Is_SPARK_Mode_On_Node): New applicable to
2874         N_Variable_Reference_Marker.
2875         (Is_Write): Use Flag5.
2876         (Save_Invocation_Graph_Of_Body): New routine.
2877         (Set_Is_Elaboration_Checks_OK_Node): Now applicable to
2878         N_Variable_Reference_Marker.
2879         (Set_Is_Elaboration_Warnings_OK_Node): Now applicable to
2880         N_Expanded_Name, N_Identifier, N_Variable_Reference_Marker.
2881         (Set_Is_SPARK_Mode_On_Node): New applicable to
2882         N_Variable_Reference_Marker.
2883         (Set_Save_Invocation_Graph_Of_Body): New routine.
2884         * sinfo.ads: Update the documentation of attributes
2885         Is_Elaboration_Checks_OK_Node, Is_Elaboration_Warnings_OK_Node,
2886         Is_SPARK_Mode_On_Node.  Update the flag usage of attributes
2887         Is_Read, Is_Write.  Add attribute Save_Invocation_Graph_Of_Body
2888         and update its occurrence in nodes.
2889         (Save_Invocation_Graph_Of_Body): New routine along with pragma
2890         Inline.
2891         (Set_Save_Invocation_Graph_Of_Body): New routine along with
2892         pragma Inline.
2893         * switch-b.adb (Scan_Binder_Switches): Refactor the scanning of
2894         debug switches.
2895         (Scan_Debug_Switches): New routine.
2896         * libgnat/g-dynhta.adb, libgnat/g-dynhta.ads (Contains): New routine.
2897         * libgnat/g-graphs.adb (Associate_Vertices): Update the use of
2898         Component_Vertex_Iterator.
2899         (Contains_Component, Contains_Edge, Contains_Vertex, Has_Next):
2900         Reimplemented.
2901         (Iterate_Component_Vertices): New routine.
2902         (Iterate_Vertices): Removed.
2903         (Next): Update the parameter profile.
2904         (Number_Of_Component_Vertices, Number_Of_Outgoing_Edges): New
2905         routines.
2906         * libgnat/g-graphs.ads: Update the initialization of
2907         No_Component.  Add type Component_Vertex_Iterator.  Remove type
2908         Vertex_Iterator.
2909         (Has_Next): Add new versions and remove old ones.
2910         (Iterate_Component_Vertices): New routine.
2911         (Iterate_Vertices): Removed.
2912         (Next): Add new versions and remove old ones.
2913         (Number_Of_Component_Vertices, Number_Of_Outgoing_Edges): New
2914         routines.
2915         * libgnat/g-sets.adb (Contains): Reimplemented.
2916         * gcc-interface/Make-lang.in (GNATBIND_OBJS): Add
2917         GNAT.Dynamic_HTables, GNAT.Graphs and Bindo units.
2918         * rtsfind.ads: Remove extra space.
2920 2019-07-03  Yannick Moy  <moy@adacore.com>
2922         * sem_spark.adb: Add support for locally borrowing and observing
2923         a path.
2924         (Get_Root_Object): Add parameter Through_Traversal to denote
2925         when we are interesting in getting to the traversed parameter.
2926         (Is_Prefix_Or_Almost): New function to support detection of
2927         illegal access to borrowed or observed paths.
2928         (Check_Pragma): Add analysis of assertion pragmas.
2930 2019-07-03  Ed Schonberg  <schonberg@adacore.com>
2932         * sem_ch13.adb (Build_Predicate_Functions): In a generic context
2933         we do not build the bodies of predicate fuctions, but the
2934         expression in a static predicate must be elaborated to allow
2935         case coverage checking within the generic unit.
2936         (Build_Discrete_Static_Predicate): In a generic context, return
2937         without building function body once the
2938         Static_Discrete_Predicate expression for the type has been
2939         constructed.
2941 2019-07-03  Hristian Kirtchev  <kirtchev@adacore.com>
2943         * bindgen.adb, inline.adb, layout.adb, sem_ch12.adb,
2944         sem_ch13.adb, sem_ch7.adb, styleg.adb: Minor reformatting.
2946 2019-07-03  Bob Duff  <duff@adacore.com>
2948         * par-ch3.adb (P_Defining_Identifier): Call
2949         Check_Defining_Identifier_Casing.
2950         * style.ads, styleg.ads, styleg.adb
2951         (Check_Defining_Identifier_Casing): New procedure to check for
2952         mixed-case defining identifiers.
2953         * stylesw.ads, stylesw.adb (Style_Check_Mixed_Case_Decls): New
2954         flag for checking for mixed-case defining identifiers.
2955         * doc/gnat_ugn/building_executable_programs_with_gnat.rst:
2956         Document new feature.
2957         * gnat_ugn.texi: Regenerate.
2959 2019-07-03  Eric Botcazou  <ebotcazou@adacore.com>
2961         * doc/gnat_ugn/building_executable_programs_with_gnat.rst
2962         (Warning message control): Document that -gnatw.z/Z apply to
2963         array types.
2964         * freeze.adb (Freeze_Entity): Give -gnatw.z warning for array
2965         types as well, but not if the specified alignment is the minimum
2966         one.
2967         * gnat_ugn.texi: Regenerate.
2969 2019-07-03  Bob Duff  <duff@adacore.com>
2971         * einfo.ads, exp_util.adb, layout.ads, sinfo.ads: Spell "laid"
2972         correctly.
2974 2019-07-03  Ed Schonberg  <schonberg@adacore.com>
2976         * sem_ch13.adb (Analyze_Attribute_Definition_Clause): No error
2977         message on attribute applied to a renaming when the renamed
2978         object is an aggregate (from code reading).
2979         (Check_Aspect_At_End_Of_Declarations): In a generic context
2980         where freeze nodes are not generated, the original expression
2981         for an aspect may need to be analyzed to precent spurious
2982         conformance errors when compared with the expression that is
2983         anakyzed at the end of the current declarative list.
2985 2019-07-03  Eric Botcazou  <ebotcazou@adacore.com>
2987         * layout.adb (Layout_Type): Do not set the component size of an
2988         array with a scalar component if the component type is
2989         overaligned.
2991 2019-07-03  Ed Schonberg  <schonberg@adacore.com>
2993         * inline.adb (Make_Loop_Labels_Unique): New procedure to modify
2994         the source code of subprograms that are inlined by the
2995         front-end, to prevent accidental duplication between loop labels
2996         in the inlined code and the code surrounding the inlined call.
2998 2019-07-03  Hristian Kirtchev  <kirtchev@adacore.com>
3000         * doc/gnat_ugn/elaboration_order_handling_in_gnat.rst: Update
3001         the section on resolving elaboration circularities to eliminate
3002         certain combinations of switches which together do not produce
3003         the desired effect and confuse users.
3004         * gnat_ugn.texi: Regenerate.
3006 2019-07-03  Arnaud Charlet  <charlet@adacore.com>
3008         * bindgen.adb (Gen_Main): Disable generation of reference to
3009         Ada_Main_Program_Name for CCG.
3010         * bindusg.adb (Display): Add -G to the command-line usage for
3011         gnatbind.
3012         * opt.ads (Generate_C_Code): Update comment.
3013         * switch-b.adb (Scan_Binder_Switches): Add handling for -G.
3015 2019-07-03  Arnaud Charlet  <charlet@adacore.com>
3017         * sem_ch7.adb (Has_Referencer): Do not consider inlined
3018         subprograms when generating C code, which allows us to generate
3019         static inline subprograms.
3021 2019-07-03  Justin Squirek  <squirek@adacore.com>
3023         * sem_ch6.adb (Check_Conformance): Add expression checking for
3024         constant modifiers in anonymous access types (in addition to
3025         "non-null" types) so that they are considered "matching" for
3026         subsequent conformance tests.
3028 2019-07-03  Arnaud Charlet  <charlet@adacore.com>
3030         * doc/gnat_rm/standard_and_implementation_defined_restrictions.rst:
3031         Clarify wording on No_Multiple_Elaboration.
3032         * gnat_rm.texi: Regenerate.
3034 2019-07-03  Ed Schonberg  <schonberg@adacore.com>
3036         * sem_ch8.adb (Find_Selected_Component): If the prefix is the
3037         current instance of a type or subtype, complete the resolution
3038         of the name by finding the component of the type denoted by the
3039         selector name.
3041 2019-07-03  Eric Botcazou  <ebotcazou@adacore.com>
3043         * doc/gnat_rm/interfacing_to_other_languages.rst (Interfacing to C):
3044         Document that boolean types with convention C now map to C99 bool.
3045         * gnat_rm.texi: Regenerate.
3047 2019-07-03  Javier Miranda  <miranda@adacore.com>
3049         * exp_attr.adb (Expand_Min_Max_Attribute): Code cleanup:
3050         removing code that it is now never executed in the CCG compiler
3051         (dead code).
3053 2019-07-02  Iain Sandoe  <iain@sandoe.co.uk>
3055         * libgnat/system-darwin-ppc.ads: Set Stack_Check_Probes True for
3056         PPC Darwin.
3058 2019-07-01  Ed Schonberg  <schonberg@adacore.com>
3060         * sem_ch12.adb (Is_Defaulted): New predicate in
3061         Check_Formal_Package_Intance, to skip the conformance of checks
3062         on parameters of a formal package that are defaulted,
3064 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3066         * checks.adb, exp_ch9.adb, exp_unst.adb, sem_ch4.adb,
3067         sem_prag.adb, sem_spark.adb: Minor reformatting.
3069 2019-07-01  Ed Schonberg  <schonberg@adacore.com>
3071         * sem_attr.adb (Analyze_Attribute, case Enum_Rep): Allow prefix
3072         of attribute to be an attribute reference of a discrete type.
3074 2019-07-01  Eric Botcazou  <ebotcazou@adacore.com>
3076         * sem_ch12.adb (Analyze_Subprogram_Instantiation): Move up
3077         handling of Has_Pragma_Inline_Always and deal with
3078         Has_Pragma_No_Inline.
3080 2019-07-01  Ed Schonberg  <schonberg@adacore.com>
3082         * sem_ch3.adb (Build_Derived_Record_Type): If the parent type is
3083         declared as a subtype of a private type with an inherited
3084         discriminant constraint, its generated full base appears as a
3085         record subtype, so we need to retrieve its oen base type so that
3086         the inherited constraint can be applied to it.
3088 2019-07-01  Yannick Moy  <moy@adacore.com>
3090         * sem_spark.adb: Completely rework the algorithm for ownership
3091         checking, as the rules in SPARK RM have changed a lot.
3092         * sem_spark.ads: Update comments.
3094 2019-07-01  Dmitriy Anisimkov  <anisimko@adacore.com>
3096         * gsocket.h (Has_Sockaddr_Len): Use the offset of sin_family offset in
3097         the sockaddr_in structure to determine the existence of length field
3098         before the sin_family.
3100 2019-07-01  Ed Schonberg  <schonberg@adacore.com>
3102         * sem_prag.adb (Analyze_Pragma, case Weak_External): Pragma only
3103         applies to entities with run-time addresses, not to types.
3105 2019-07-01  Piotr Trojanek  <trojanek@adacore.com>
3107         * einfo.adb, sem_ch7.adb, sem_prag.adb, sem_util.adb: Update
3108         references to the SPARK RM after the removal of Rule 7.1.4(5).
3110 2019-07-01  Piotr Trojanek  <trojanek@adacore.com>
3112         * sysdep.c: Cleanup references to LynuxWorks in docs and
3113         comments.
3115 2019-07-01  Ed Schonberg  <schonberg@adacore.com>
3117         * checks.adb (Insert_Valid_Check): Do not apply validity check
3118         to variable declared within a protected object that uses the
3119         Lock_Free implementation, to prevent unwarranted constant
3120         folding, because entities within such an object msut be treated
3121         as volatile.
3123 2019-07-01  Eric Botcazou  <ebotcazou@adacore.com>
3125         * exp_ch9.adb (Check_Inlining): Deal with Has_Pragma_No_Inline.
3127 2019-07-01  Ed Schonberg  <schonberg@adacore.com>
3129         * exp_unst.adb (Visit_Node, Check_Static_Type): Improve the
3130         handling of private and incomplete types whose full view is an
3131         access type, to detect additional uplevel references in dynamic
3132         bounds. This is relevant to N_Free_Statement among others that
3133         manipulate types whose full viww may be an access type.
3135 2019-07-01  Pat Rogers  <rogers@adacore.com>
3137         * doc/gnat_rm/representation_clauses_and_pragmas.rst: Correct
3138         size indicated for R as a component of an array.
3139         * gnat_rm.texi: Regenerate.
3141 2019-07-01  Justin Squirek  <squirek@adacore.com>
3143         * libgnat/s-win32.ads: Add definition for ULONG, modify
3144         OVERLAPPED type, and add appropriate pragmas.
3146 2019-07-01  Bob Duff  <duff@adacore.com>
3148         * gnat1drv.adb (gnat1drv): Call Write_ALI if the main unit is
3149         ignored-ghost.
3151 2019-07-01  Yannick Moy  <moy@adacore.com>
3153         * sem_ch4.adb (Operator_Check): Refine error message.
3155 2019-07-01  Piotr Trojanek  <trojanek@adacore.com>
3157         * libgnat/a-calend.ads: Revert "Global => null" contracts on
3158         non-pure routines.
3160 2019-07-01  Piotr Trojanek  <trojanek@adacore.com>
3162         * exp_attr.adb, libgnat/g-graphs.ads: Fix typos in comments:
3163         componant -> component.
3165 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3167         * libgnat/g-graphs.adb: Use type Directed_Graph rather than
3168         Instance in various routines.
3169         * libgnat/g-graphs.ads: Change type Instance to Directed_Graph.
3170         Update various routines that mention the type.
3172 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3174         * libgnat/g-sets.adb: Use type Membership_Set rathern than
3175         Instance in various routines.
3176         * libgnat/g-sets.ads: Change type Instance to Membership_Set.
3177         Update various routines that mention the type.
3179 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3181         * libgnat/g-lists.adb: Use type Doubly_Linked_List rather than
3182         Instance in various routines.
3183         * libgnat/g-lists.ads: Change type Instance to
3184         Doubly_Linked_List. Update various routines that mention the
3185         type.
3187 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3189         * libgnat/g-dynhta.adb: Use type Dynamic_Hash_Table rather than
3190         Instance in various routines.
3191         * libgnat/g-dynhta.ads: Change type Instance to
3192         Dynamic_Hash_Table. Update various routines that mention the
3193         type.
3195 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3197         * exp_attr.adb, exp_ch7.adb, exp_unst.adb, sem_ch3.adb,
3198         sem_util.adb, uintp.adb, uintp.ads: Minor reformatting.
3200 2019-07-01  Javier Miranda  <miranda@adacore.com>
3202         * exp_attr.adb (Expand_Min_Max_Attribute): Disable expansion of
3203         'Min/'Max on integer, enumeration, fixed point and floating
3204         point types since the CCG backend now provides in file
3205         standard.h routines to support it.
3207 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3209         * impunit.adb: Add GNAT.Graphs to list Non_Imp_File_Names_95.
3210         * Makefile.rtl, gcc-interface/Make-lang.in: Register unit
3211         GNAT.Graphs.
3212         * libgnat/g-dynhta.adb: Various minor cleanups (use Present
3213         rather than direct comparisons).
3214         (Delete): Reimplement to use Delete_Node.
3215         (Delete_Node): New routine.
3216         (Destroy_Bucket): Invoke the provided destructor.
3217         (Present): New routines.
3218         * libgnat/g-dynhta.ads: Add new generic formal Destroy_Value.
3219         Use better names for the components of iterators.
3220         * libgnat/g-graphs.adb, libgnat/g-graphs.ads: New unit.
3221         * libgnat/g-lists.adb: Various minor cleanups (use Present
3222         rather than direct comparisons).
3223         (Delete_Node): Invoke the provided destructor.
3224         (Present): New routine.
3225         * libgnat/g-lists.ads: Add new generic formal Destroy_Element.
3226         Use better names for the components of iterators.
3227         (Present): New routine.
3228         * libgnat/g-sets.adb, libgnat/g-sets.ads (Destroy, Preset,
3229         Reset): New routines.
3231 2019-07-01  Dmitriy Anisimkov  <anisimko@adacore.com>
3233         * libgnat/g-sothco.adb (Get_Address): Fix the case when AF_INET6
3234         is not defined.
3236 2019-07-01  Ed Schonberg  <schonberg@adacore.com>
3238         * exp_attr.adb (Expand_Attribute_Reference, case Invalid_Value):
3239         Resolve result of call to Get_Simple_Init_Val, which may be a
3240         conversion of a literal.
3242 2019-07-01  Hristian Kirtchev  <kirtchev@adacore.com>
3244         * freeze.adb (Freeze_Expression): Remove the horrible useless
3245         name hiding of N. Insert the freeze nodes generated by the
3246         expression prior to the expression when the nearest enclosing
3247         scope is transient.
3249 2019-07-01  Pierre-Marie de Rodat  <derodat@adacore.com>
3251         * doc/gnat_ugn/building_executable_programs_with_gnat.rst: Fix
3252         formatting issues in the -gnatR section.
3253         * gnat_ugn.texi: Regenerate.
3255 2019-06-30  Iain Sandoe  <iain@sandoe.co.uk>
3257         * gnatlink.adb (Link_Step): Remove duplicate -static-libgcc switches.
3258         Push -shared-libgcc explicitly, when it is the target default (unless
3259         overidden by the static flag).
3260         When the user has put an instance of shared/static-libgcc do not push
3261         a duplicate of this.
3263 2019-06-29  Eric Botcazou  <ebotcazou@adacore.com>
3265         * gcc-interface/decl.c (gnat_to_gnu_entity): Beep up comment on SAVED,
3266         and tweak comment on the assertion about the scopes of Itypes.  Do not
3267         skip the regular processing for Itypes that are E_Record_Subtype with
3268         a Cloned_Subtype.  Get the Cloned_Subtype for every E_Record_Subtype
3269         if the type is dummy and hasn't got its own freeze node.
3270         <E_Record_Subtype>: Save again the DECL of the Cloned_Subtype, if any.
3271         <E_Access_Subtype>: Save again the DECL of the equivalent type.
3272         (Gigi_Equivalent_Type) <E_Access_Subtype>: New case.
3274 2019-06-29  Eric Botcazou  <ebotcazou@adacore.com>
3276         * gcc-interface/utils.c (unchecked_convert): Tweak comment.  Only skip
3277         dereferences when padding to have the same size on both sides.  Do it
3278         for destination types with self-referential size too.
3280 2019-06-29  Eric Botcazou  <ebotcazou@adacore.com>
3282         * gcc-interface/decl.c (gnat_to_gnu_entity) <E_Record_Type>: If the
3283         type requires strict alignment, then set the RM size to the type size.
3284         Rework handling of alignment and sizes of tagged types in ASIS mode.
3285         (validate_size): Rename local variable and remove special handling for
3286         strict-alignment types.
3287         * gcc-interface/utils.c (finish_record_type): Constify local variables
3288         and use properly typed constants.
3290 2019-06-29  Eric Botcazou  <ebotcazou@adacore.com>
3292         * gcc-interface/decl.c (gnat_to_gnu_field): Rework error messages for
3293         fields requiring strict alignment, add explicit test on Storage_Unit
3294         for position and size, and mention type alignment for position.
3296 2019-06-29  Eric Botcazou  <ebotcazou@adacore.com>
3298         * gcc-interface/trans.c (mark_visited_r): Set TYPE_SIZES_GIMPLIFIED on
3299         the main variant of a type, if any.
3301 2019-06-29  Eric Botcazou  <ebotcazou@adacore.com>
3303         * gcc-interface/decl.c (set_nonaliased_component_on_array_type): Add
3304         missing guard for the presence of TYPE_CANONICAL.
3305         (set_reverse_storage_order_on_array_type): Likewise.
3307 2019-06-29  Eric Botcazou  <ebotcazou@adacore.com>
3309         * gcc-interface/gigi.h (make_packable_type): Remove default value.
3310         (value_factor_p): Tweak prototype.
3311         * gcc-interface/decl.c (gnat_to_gnu_entity): Add comment.
3312         (gnat_to_gnu_component_type): Likewise.
3313         (gnat_to_gnu_field): Likewise.  Fetch the position of the field earlier
3314         and simplify the condition under which the type is packed.  Declare
3315         local variable is_bitfield.  Pass 1 as max_align to make_packable_type
3316         if it is set to true.
3317         (copy_and_substitute_in_layout): Pass 0 to make_packable_type.
3318         * gcc-interface/utils.c (make_packable_array_type): New function.
3319         (make_packable_type): Use it to rewrite the type of array field.
3320         (maybe_pad_type): Pass align parameter to make_packable_type.
3321         (create_field_decl): Minor tweaks.
3322         (value_factor_p): Assert that FACTOR is a power of 2 and replace the
3323         modulo computation by a masking operation.
3325 2019-06-25  Eric Botcazou  <ebotcazou@adacore.com>
3327         * gcc-interface/decl.c (gnat_to_gnu_entity): Remove superfluous test
3328         in previous change.
3329         * gcc-interface/gigi.h (maybe_character_type): Fix formatting.
3330         (maybe_character_value): Likewise.
3332 2019-06-24  Jan Hubicka  <jh@suse.cz>
3334         * gcc-interface/decl.c (gnat_to_gnu_entity): Check that
3335         type is array or integer prior checking string flag.
3336         * gcc-interface/gigi.h (maybe_character_type): Likewise.
3337         (maybe_character_value): Likewise.
3339 2019-06-24  Martin Sebor  <msebor@redhat.com>
3341         * gcc-interface/utils.c (handle_nonnull_attribute): Quote attribute
3342         name.
3344 2019-06-18  Arnaud Charlet  <charlet@adacore.com>
3346         PR ada/80590
3347         * sem_ch5.adb (Analyze_Loop_Statement): Avoid exception propagation
3348         during normal processing.
3350 2019-06-17  Arnaud Charlet  <charlet@adacore.com>
3352         PR ada/80590
3353         * exp_ch9.adb (Expand_N_Delay_Relative_Statement): Swap the two
3354         conditions to avoid a unnecessary exception propagation in the default
3355         case.
3357 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3359         * gcc-interface/utils.c (handle_stack_protect_attribute): Move around.
3361 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3363         * doc/gnat_rm/implementation_defined_pragmas.rst (Machine_Attribute):
3364         Document additional optional parameters.
3365         * sem_prag.adb (Analyze_Pragma) <Pragma_Machine_Attribute>: Accept
3366         more than one optional parameter.
3367         * gcc-interface/decl.c (prepend_one_attribute_pragma): Alphabetize
3368         the list of supported pragmas.  Simplify the handling of parameters
3369         and add support for more than one optional parameter.
3370         * gcc-interface/utils.c (attr_cold_hot_exclusions): New constant.
3371         (gnat_internal_attribute_table): Add entry for no_icf, noipa, flatten,
3372         used, cold, hot, target and target_clones.
3373         (begin_subprog_body): Do not create the RTL for the subprogram here.
3374         (handle_noicf_attribute): New static function.
3375         (handle_noipa_attribute): Likewise.
3376         (handle_flatten_attribute): Likewise.
3377         (handle_used_attribute): Likewise.
3378         (handle_cold_attribute): Likewise.
3379         (handle_hot_attribute): Likewise.
3380         (handle_target_attribute): Likewise.
3381         (handle_target_clones_attribute): Likewise.
3383 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3385         * gcc-interface/trans.c (lvalue_required_for_attribute_p): Return 0
3386         for 'Size too.
3387         (Identifier_to_gnu): Use the actual subtype for a reference to a
3388         packed array in a return statement.
3389         (Attribute_to_gnu) <Attr_Size>: Do not strip VIEW_CONVERT_EXPRs from
3390         the prefix in every case.
3392 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3394         * gcc-interface/trans.c (gnat_to_gnu): Remove superfluous tests on
3395         Backend_Overflow_Checks_On_Target and rework comments.
3397 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3399         * gcc-interface/trans.c (walk_nesting_tree): New static function.
3400         (finalize_nrv): Use it to walk the entire nesting tree.
3402 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3404         * gcc-interface/decl.c (gnat_to_gnu_entity) <E_Record_Subtype>: Remove
3405         obsolete test on Is_For_Access_Subtype.
3407 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3409         * gcc-interface/decl.c (components_to_record): Set a name on the type
3410         created for the REP part, if any.
3411         * gcc-interface/utils.c (finish_record_type): Only take the maximum
3412         when merging sizes for a variant part at offset 0.
3413         (merge_sizes): Rename has_rep parameter into max.
3415 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3417         * gcc-interface/utils.c (gnat_internal_attribute_table): Add support
3418         for stack_protect attribute.
3419         (handle_stack_protect_attribute): New static function.
3421 2019-05-28  Eric Botcazou  <ebotcazou@adacore.com>
3423         * gcc-interface/decl.c (intrin_arglists_compatible_p): Do not return
3424         false if the internal builtin uses a variable list.
3426 2019-05-27  Eric Botcazou  <ebotcazou@adacore.com>
3428         * gcc-interface/trans.c (Call_to_gnu): Do not initialize the temporary
3429         created out of addressability concerns if it's for the _Init parameter
3430         of an initialization procedure.
3432 2019-05-27  Eric Botcazou  <ebotcazou@adacore.com>
3434         * gcc-interface/ada-builtin-types.def: New file.
3435         * gcc-interface/ada-builtins.def: Likewise.
3436         * gcc-interface/ada-tree.h (BUILT_IN_LIKELY): New macro.
3437         (BUILT_IN_UNLIKELY): Likewise.
3438         * gcc-interface/trans.c (independent_iterations_p): Initialize the
3439         auto-vector to 16 elements.
3440         (Call_to_gnu): Remove local variable and change the vector of actual
3441         parameters to an auto-vector.  Do not convert actual parameters to
3442         the argument type for front-end built-in functions.  Add support for
3443         front-end built-in functions.
3444         (build_noreturn_cond): Use internal instead of built-in function.
3445         * gcc-interface/utils.c (c_builtin_type): Include ada-builtin-types.def
3446         (install_builtin_function_types): Likewise.
3447         (install_builtin_functions): Include ada-builtins.def first.
3449 2019-05-27  Eric Botcazou  <ebotcazou@adacore.com>
3451         * gcc-interface/utils.c (maybe_pad_type): Issue the warning for the
3452         specific case of component types preferably.
3454 2019-05-27  Eric Botcazou  <ebotcazou@adacore.com>
3456         * gcc-interface/trans.c (Identifier_to_gnu): Minor tweaks.
3457         (gnat_to_gnu): Do not convert the result if it is a reference to an
3458         unconstrained array used as the prefix of an attribute reference that
3459         requires an lvalue.
3461 2019-05-27  Eric Botcazou  <ebotcazou@adacore.com>
3463         * gcc-interface/trans.c (Gigi_Types_Compatible): New predicate.
3464         (Identifier_to_gnu): Use it to assert that the type of the identifier
3465         and that of its entity are compatible for gigi.  Rename a couple of
3466         local variables and separate the processing of the result type.
3468 2019-05-27  Eric Botcazou  <ebotcazou@adacore.com>
3470         * gcc-interface/trans.c (Call_to_gnu): Use the unpadded type when
3471         putting back an intermediate conversion the type of the actuals.
3473 2019-05-27  Eric Botcazou  <ebotcazou@adacore.com>
3475         * gcc-interface/trans.c (gnat_to_gnu) <Shift operations>: Convert the
3476         count to the unsigned version of its base type before proceeding.
3478 2019-05-16  Martin Sebor  <msebor@redhat.com>
3480         * gcc-interface/trans.c (check_inlining_for_nested_subprog): Quote
3481         reserved names.
3483 2019-05-08  Arnaud Charlet  <charlet@adacore.com>
3485         * standard.ads.h: New file.
3487 2019-05-07  Rainer Orth  <ro@CeBiTec.Uni-Bielefeld.DE>
3489         * gcc-interface/Makefile.in (install-gcc-specs): Use foreach.
3490         Honor DESTDIR.
3492 2019-04-29  Michael K. Darling  <darlingm@gmail.com>
3494         * gnatvsn.ads: Bump Library_Version to 10.
3496 2019-04-24  Ramana Radhakrishnan  <ramana.radhakrishnan@arm.com>
3497             Bernd Edlinger  <bernd.edlinger@hotmail.de>
3498             Jakub Jelinek  <jakub@redhat.com>
3500         PR target/89093
3501         * raise-gcc.c (TARGET_ATTRIBUTE): Define.
3502         (continue_unwind, personality_body, PERSONALITY_FUNCTION): Add
3503         TARGET_ATTRIBUTE.
3505 2019-04-07  Eric Botcazou  <ebotcazou@adacore.com>
3507         * libgnat/i-cexten.ads (CFloat_128): New type.
3509 2019-03-22  Dmitriy Anisimkov  <anisimko@adacore.com>
3511         PR ada/89583
3512         * libgnat/g-socket.adb (Bind_Socket, Connect_Socket,
3513         Send_Socket): Fix the computation of structure lengths passed to
3514         low level routines.
3515         (Is_IPv6_Address): Fix the number of expected colons.
3517 2019-03-11  Martin Liska  <mliska@suse.cz>
3519         * gcc-interface/misc.c (gnat_post_options): Wrap option name in string
3520         format message and fix GNU coding style.
3522 2019-02-08  Eric Botcazou  <ebotcazou@adacore.com>
3524         * gcc-interface/trans.c (gnat_to_gnu) <N_Aggregate>: Minor tweak.
3525         * gcc-interface/utils.c (convert): Do not pad when doing an unchecked
3526         conversion here.  Use TREE_CONSTANT throughout the function.
3527         (unchecked_convert): Also pad if the source is a CONSTRUCTOR and the
3528         destination is a more aligned array type or a larger aggregate type,
3529         but not between original and packable versions of a type.
3531 2019-02-08  Eric Botcazou  <ebotcazou@adacore.com>
3533         * gcc-interface/utils.c (max_size) <tcc_unary>: Be prepared for an
3534         operand with VOID_TYPE.
3536 2019-02-08  Eric Botcazou  <ebotcazou@adacore.com>
3538         * gcc-interface/trans.c (elaborate_all_entities): Do not elaborate the
3539         entities of a package renaming another one.
3541 2019-02-08  Eric Botcazou  <ebotcazou@adacore.com>
3543         * gcc-interface/trans.c (Regular_Loop_to_gnu): Replace tests on
3544         individual flag_unswitch_loops and flag_tree_loop_vectorize switches
3545         with test on global optimize switch.
3546         (Raise_Error_to_gnu): Likewise.
3548 2019-02-07  Eric Botcazou  <ebotcazou@adacore.com>
3550         * libgnarl/s-linux__sparc.ads (ETIMEDOUT): Set to correct value.
3552 2019-02-06  Arnaud Charlet  <charlet@adacore.com>
3554         * libgnarl/s-linux__x32.ads: Resync list of signals with s-linux.ads
3556 2019-01-27  Eric Botcazou  <ebotcazou@adacore.com>
3558         * repinfo.adb (List_Component_Layout): Remove superfluous space for
3559         zero-sized field.
3560         * gcc-interface/ada-tree.h (TYPE_IS_EXTRA_SUBTYPE_P): New macro.
3561         * gcc-interface/gigi.h (create_extra_subtype): Declare.
3562         * gcc-interface/decl.c (TYPE_ARRAY_SIZE_LIMIT): Likewise.
3563         (update_n_elem): New function.
3564         (gnat_to_gnu_entity): Use create_extra_subtype to create extra subtypes
3565         instead of doing it manually.
3566         <E_Array_Type>: Use update_n_elem to compute the maximum size.  Use the
3567         index type instead of base type for the bounds. Set TYPE_ARRAY_MAX_SIZE
3568         of the array to the maximum size.
3569         <E_Array_Subtype>: Create an extra subtype using the index type of the
3570         base array type for self-referential bounds.  Use update_n_elem to
3571         compute the maximum size.  Set TYPE_ARRAY_MAX_SIZE of the array to the
3572         maximum size.
3573         (gnat_to_gnu_field): Clear DECL_NONADDRESSABLE_P on discriminants.
3574         * gcc-interface/misc.c (gnat_get_alias_set): Return the alias set of
3575         the base type for an extra subtype.
3576         (gnat_type_max_size): Remove obsolete code.
3577         * gcc-interface/trans.c (Attribute_to_gnu): Minor tweak.
3578         (can_be_lower_p): Deal with pathological types.
3579         * gcc-interface/utils.c (create_extra_subtype): New function.
3580         (create_field_decl): Minor tweak.
3581         (max_size) <tcc_reference>: Compute a better value by using the extra
3582         subtypes on the self-referential bounds.
3583         <tcc_binary>: Rewrite.  Deal with "negative value" in unsigned types.
3584         <tcc_expression>: Likewise.
3585         * gcc-interface/utils2.c (compare_arrays): Retrieve the original bounds
3586         of the arrays upfront.  Swap only if the second length is not constant.
3587         Use comparisons on the original bounds consistently for the null tests.
3588         (build_binary_op): Use TYPE_IS_EXTRA_SUBTYPE_P macro.
3589         (build_allocator): Minor tweak.
3591 2019-01-27  Eric Botcazou  <ebotcazou@adacore.com>
3593         * gcc-interface/decl.c (array_type_has_nonaliased_component): Return
3594         the same value for every dimension of a multidimensional array type.
3596 2019-01-26  Eric Botcazou  <ebotcazou@adacore.com>
3598         * gcc-interface/trans.c (Regular_Loop_to_gnu): Use the SLOC of the
3599         iteration scheme, if present, throughout the translation.
3601 2019-01-26  Eric Botcazou  <ebotcazou@adacore.com>
3603         * gcc-interface/trans.c (gnat_to_gnu) <N_Assignment_Statement>: Use
3604         DECL_SIZE_UNIT instead of TYPE_SIZE_UNIT for the size to be assigned
3605         by a call to memset if the LHS is a DECL.
3607 2019-01-26  Eric Botcazou  <ebotcazou@adacore.com>
3609         * gcc-interface/trans.c (struct loop_info_d): Remove artificial field.
3610         (Loop_Statement_to_gnu): Do not set it.
3612 2019-01-26  Eric Botcazou  <ebotcazou@adacore.com>
3614         * gcc-interface/trans.c (Iterate_Acc_Clause_Arg): Fix formatting.
3615         (Acc_gnat_to_gnu): Likewise.
3616         (Acc_Data_to_gnu): Likewise.
3617         (Acc_Var_to_gnu): Likewise.
3618         (Acc_Reduc_to_gnu): Likewise.
3619         (Acc_Size_List_to_gnu): Likewise.
3620         (Pragma_to_gnu) <Pragma_Acc_Loop>: Likewise.
3621         <Pragma_Acc_Data>): Likewise.
3622         (find_loop_for): Remove default value for parameters.
3623         * gcc-interface/trans.c (gnat_to_gnu) <N_Op_And>: Merge into...
3624         <N_Op_Eq>): ...this.
3626 2019-01-26  Eric Botcazou  <ebotcazou@adacore.com>
3628         * gcc-interface/decl.c (annotate_value) <INTEGER_CST>: Use test on
3629         the sign bit instead of on the sign of the value.
3630         <PLUS_EXPR>: Turn addition of negative constant into subtraction.
3631         <MULT_EXPR>: Add test for degenerate case.
3632         <BIT_AND_EXPR>: Simplify.
3634 2019-01-18  Sebastian Huber  <sebastian.huber@embedded-brains.de>
3636         * s-oscons-tmplt.c (AF_INET6): Do not undefine for RTEMS.
3638 2019-01-09  Sandra Loosemore  <sandra@codesourcery.com>
3640         PR other/16615
3641         * exp_ch11.adb: Change "can not" to "cannot".
3642         * sem_ch4.adb: Likewise.
3644 2019-01-09  Sandra Loosemore  <sandra@codesourcery.com>
3646         PR other/16615
3647         * exp_ch9.adb: Mechanically replace "can not" with "cannot".
3648         * libgnat/s-regpat.ads: Likewise.
3649         * par-ch4.adb: Likewise.
3650         * set_targ.adb: Likewise.
3651         * types.ads: Likewise.
3653 2019-01-08  Justin Squirek  <squirek@adacore.com>
3655         Revert:
3656         2018-07-31  Justin Squirek  <squirek@adacore.com>
3658         * lib-writ.adb (Write_With_Lines): Modfiy the generation
3659         of dependencies within ali files so that source unit
3660         bodies are properly listed even if said bodies are
3661         missing.  Perform legacy behavior in GNATprove mode.
3662         * lib-writ.ads: Modify documentation to reflect current
3663         behavior.
3665         and:
3666         2018-09-26  Justin Squirek  <squirek@adacore.com>
3668         * lib-writ.adb, lib-writ.ads (Write_With_Lines): Add
3669         documentation and an extra conditional check for RCI
3670         units so that generated ali files will list the spec
3671         only instead of a body when a body is not found.
3673 2019-01-04  Eric Botcazou  <ebotcazou@adacore.com>
3675         * gnatvsn.ads: Bump copyright year.
3677 2019-01-01  Jakub Jelinek  <jakub@redhat.com>
3679         Update copyright years.
3681         * gnat_ugn.texi: Bump @copying's copyright year.
3682         * gnat_rm.texi: Likewise.
3684 Copyright (C) 2019 Free Software Foundation, Inc.
3686 Copying and distribution of this file, with or without modification,
3687 are permitted in any medium without royalty provided the copyright
3688 notice and this notice are preserved.