From d2d9cc2290489f4ebbcf86544b806f0cd7fb59f2 Mon Sep 17 00:00:00 2001
From: Arnaud Charlet <charlet@gcc.gnu.org>
Date: Tue, 2 Aug 2011 15:29:08 +0200
Subject: [PATCH] [multiple changes]

2011-08-02  Robert Dewar  <dewar@adacore.com>

	* exp_ch3.adb: Minor comment additions.
	* sem_ch13.adb: Minor reformatting.

2011-08-02  Arnaud Charlet  <charlet@adacore.com>

	* exp_pakd.adb (Expand_Packed_Element_Reference): Revert previous change

2011-08-02  Pascal Obry  <obry@adacore.com>

	* make.adb, makeutl.adb: Removes some superfluous directory separator.

From-SVN: r177150
---
 gcc/ada/ChangeLog    | 14 +++++++++-----
 gcc/ada/exp_ch3.adb  |  7 ++++++-
 gcc/ada/exp_pakd.adb |  7 -------
 gcc/ada/make.adb     | 22 +---------------------
 gcc/ada/makeutl.adb  |  6 ------
 gcc/ada/sem_ch13.adb |  2 +-
 6 files changed, 17 insertions(+), 41 deletions(-)

diff --git a/gcc/ada/ChangeLog b/gcc/ada/ChangeLog
index 09f5a9552c2a..cf7374dc8bff 100644
--- a/gcc/ada/ChangeLog
+++ b/gcc/ada/ChangeLog
@@ -1,3 +1,12 @@
+2011-08-02  Robert Dewar  <dewar@adacore.com>
+
+	* exp_ch3.adb: Minor comment additions.
+	* sem_ch13.adb: Minor reformatting.
+
+2011-08-02  Pascal Obry  <obry@adacore.com>
+
+	* make.adb, makeutl.adb: Removes some superfluous directory separator.
+
 2011-08-02  Robert Dewar  <dewar@adacore.com>
 
 	* sem_attr.adb: Minor reformatting.
@@ -63,11 +72,6 @@
 	(Interface_Name): Add missing documentation on JGNAT only uses of
 	this attribute.
 
-2011-08-02  Javier Miranda  <miranda@adacore.com>
-
-	* exp_pakd.adb (Expand_Packed_Element_Reference): Disable this routine
-	in CodePeer mode.
-
 2011-08-02  Geert Bosch  <bosch@adacore.com>
 
 	* cstand.adb (Back_End_Float_Types): Use Elist instead of Nlist
diff --git a/gcc/ada/exp_ch3.adb b/gcc/ada/exp_ch3.adb
index 99a14fdfffc0..f41db8628987 100644
--- a/gcc/ada/exp_ch3.adb
+++ b/gcc/ada/exp_ch3.adb
@@ -4481,7 +4481,8 @@ package body Exp_Ch3 is
    --  table and the initialization procedure have to be deferred to this
    --  point, since we reference previously declared primitive subprograms.
 
-   --  For all types, we call an initialization procedure if there is one
+   --  The above comment is in the wrong place, it should be at the proper
+   --  point in this routine ???
 
    procedure Expand_N_Object_Declaration (N : Node_Id) is
       Def_Id   : constant Entity_Id  := Defining_Identifier (N);
@@ -4998,6 +4999,8 @@ package body Exp_Ch3 is
 
             return;
 
+         --  Comment needed here, what case is this???
+
          else
             --  In most cases, we must check that the initial value meets any
             --  constraint imposed by the declared type. However, there is one
@@ -5300,6 +5303,8 @@ package body Exp_Ch3 is
    -- Expand_Record_Controller --
    ------------------------------
 
+   --  Need some more comments in this body ???
+
    procedure Expand_Record_Controller (T : Entity_Id) is
       Def             : Node_Id := Type_Definition (Parent (T));
       Comp_List       : Node_Id;
diff --git a/gcc/ada/exp_pakd.adb b/gcc/ada/exp_pakd.adb
index 9367e9391926..4d3ea0688194 100644
--- a/gcc/ada/exp_pakd.adb
+++ b/gcc/ada/exp_pakd.adb
@@ -1932,13 +1932,6 @@ package body Exp_Pakd is
       Arg   : Node_Id;
 
    begin
-      --  Disable this routine in CodePeer mode since the expansion of packed
-      --  arrays confuses the gnat2scil back end.
-
-      if CodePeer_Mode then
-         return;
-      end if;
-
       --  If not bit packed, we have the enumeration case, which is easily
       --  dealt with (just adjust the subscripts of the indexed component)
 
diff --git a/gcc/ada/make.adb b/gcc/ada/make.adb
index 5fe7c7454c33..d1fec9219530 100644
--- a/gcc/ada/make.adb
+++ b/gcc/ada/make.adb
@@ -3826,14 +3826,7 @@ package body Make is
                     Get_Name_String (Project.Directory.Display_Name);
 
                begin
-                  if Parent_Directory (Parent_Directory'Last) =
-                                                 Directory_Separator
-                  then
-                     return Parent_Directory & Path_Name;
-
-                  else
-                     return Parent_Directory & Directory_Separator & Path_Name;
-                  end if;
+                  return Parent_Directory & Path_Name;
                end;
             end if;
          end;
@@ -5203,13 +5196,6 @@ package body Make is
                   if not Is_Absolute_Path (Exec_File_Name) then
                      Get_Name_String
                        (Main_Project.Exec_Directory.Display_Name);
-
-                     if not
-                       Is_Directory_Separator (Name_Buffer (Name_Len))
-                     then
-                        Add_Char_To_Name_Buffer (Directory_Separator);
-                     end if;
-
                      Add_Str_To_Name_Buffer (Exec_File_Name);
                      Saved_Linker_Switches.Table (J + 1) :=
                        new String'(Name_Buffer (1 .. Name_Len));
@@ -5458,11 +5444,6 @@ package body Make is
             begin
                if not Is_Absolute_Path (Exec_File_Name) then
                   Get_Name_String (Main_Project.Exec_Directory.Display_Name);
-
-                  if Name_Buffer (Name_Len) /= Directory_Separator then
-                     Add_Char_To_Name_Buffer (Directory_Separator);
-                  end if;
-
                   Add_Str_To_Name_Buffer (Exec_File_Name);
                   Executable := Name_Find;
                end if;
@@ -6074,7 +6055,6 @@ package body Make is
                                (Get_Name_String
                                  (Library_Projs.Table
                                    (Index).Library_Dir.Display_Name) &
-                                Directory_Separator &
                                 "lib" &
                                 Get_Name_String
                                   (Library_Projs.Table (Index). Library_Name) &
diff --git a/gcc/ada/makeutl.adb b/gcc/ada/makeutl.adb
index 1ac84a2b3f89..e5c5a9e4bdc0 100644
--- a/gcc/ada/makeutl.adb
+++ b/gcc/ada/makeutl.adb
@@ -417,12 +417,6 @@ package body Makeutl is
                           (ALI_Project.Object_Directory.Display_Name);
                      end if;
 
-                     if not
-                       Is_Directory_Separator (Name_Buffer (Name_Len))
-                     then
-                        Add_Char_To_Name_Buffer (Directory_Separator);
-                     end if;
-
                      Add_Str_To_Name_Buffer (ALI);
                      Add_Char_To_Name_Buffer (ASCII.LF);
 
diff --git a/gcc/ada/sem_ch13.adb b/gcc/ada/sem_ch13.adb
index 2a1134f4e991..a1af56f5aec2 100644
--- a/gcc/ada/sem_ch13.adb
+++ b/gcc/ada/sem_ch13.adb
@@ -7002,7 +7002,7 @@ package body Sem_Ch13 is
         and then No (Underlying_Type (T))
         and then
           (Nkind (N) /= N_Pragma
-             or else Get_Pragma_Id (N) /= Pragma_Import)
+            or else Get_Pragma_Id (N) /= Pragma_Import)
       then
          Error_Msg_N
            ("representation item must be after full type declaration", N);
-- 
GitLab