repo_name
stringlengths
9
74
language
stringclasses
1 value
length_bytes
int64
11
9.34M
extension
stringclasses
2 values
content
stringlengths
11
9.34M
reznikmm/matreshka
Ada
10,231
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.UMLDI.UML_Activity_Diagrams; with AMF.UMLDI.UML_Association_End_Labels; with AMF.UMLDI.UML_Association_Or_Connector_Or_Link_Shapes; with AMF.UMLDI.UML_Class_Diagrams; with AMF.UMLDI.UML_Classifier_Shapes; with AMF.UMLDI.UML_Compartmentable_Shapes; with AMF.UMLDI.UML_Compartments; with AMF.UMLDI.UML_Component_Diagrams; with AMF.UMLDI.UML_Composite_Structure_Diagrams; with AMF.UMLDI.UML_Deployment_Diagrams; with AMF.UMLDI.UML_Edges; with AMF.UMLDI.UML_Interaction_Diagrams; with AMF.UMLDI.UML_Interaction_Table_Labels; with AMF.UMLDI.UML_Keyword_Labels; with AMF.UMLDI.UML_Labels; with AMF.UMLDI.UML_Multiplicity_Labels; with AMF.UMLDI.UML_Name_Labels; with AMF.UMLDI.UML_Object_Diagrams; with AMF.UMLDI.UML_Package_Diagrams; with AMF.UMLDI.UML_Profile_Diagrams; with AMF.UMLDI.UML_Redefines_Labels; with AMF.UMLDI.UML_Shapes; with AMF.UMLDI.UML_State_Machine_Diagrams; with AMF.UMLDI.UML_State_Shapes; with AMF.UMLDI.UML_Stereotype_Property_Value_Labels; with AMF.UMLDI.UML_Styles; with AMF.UMLDI.UML_Typed_Element_Labels; with AMF.UMLDI.UML_Use_Case_Diagrams; package AMF.Factories.UMLDI_Factories is pragma Preelaborate; type UMLDI_Factory is limited interface and AMF.Factories.Factory; type UMLDI_Factory_Access is access all UMLDI_Factory'Class; for UMLDI_Factory_Access'Storage_Size use 0; not overriding function Create_UML_Activity_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Activity_Diagrams.UMLDI_UML_Activity_Diagram_Access is abstract; not overriding function Create_UML_Association_End_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Association_End_Labels.UMLDI_UML_Association_End_Label_Access is abstract; not overriding function Create_UML_Association_Or_Connector_Or_Link_Shape (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Association_Or_Connector_Or_Link_Shapes.UMLDI_UML_Association_Or_Connector_Or_Link_Shape_Access is abstract; not overriding function Create_UML_Class_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Class_Diagrams.UMLDI_UML_Class_Diagram_Access is abstract; not overriding function Create_UML_Classifier_Shape (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Classifier_Shapes.UMLDI_UML_Classifier_Shape_Access is abstract; not overriding function Create_UML_Compartment (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Compartments.UMLDI_UML_Compartment_Access is abstract; not overriding function Create_UML_Compartmentable_Shape (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Compartmentable_Shapes.UMLDI_UML_Compartmentable_Shape_Access is abstract; not overriding function Create_UML_Component_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Component_Diagrams.UMLDI_UML_Component_Diagram_Access is abstract; not overriding function Create_UML_Composite_Structure_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Composite_Structure_Diagrams.UMLDI_UML_Composite_Structure_Diagram_Access is abstract; not overriding function Create_UML_Deployment_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Deployment_Diagrams.UMLDI_UML_Deployment_Diagram_Access is abstract; not overriding function Create_UML_Edge (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Edges.UMLDI_UML_Edge_Access is abstract; not overriding function Create_UML_Interaction_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Interaction_Diagrams.UMLDI_UML_Interaction_Diagram_Access is abstract; not overriding function Create_UML_Interaction_Table_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Interaction_Table_Labels.UMLDI_UML_Interaction_Table_Label_Access is abstract; not overriding function Create_UML_Keyword_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Keyword_Labels.UMLDI_UML_Keyword_Label_Access is abstract; not overriding function Create_UML_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Labels.UMLDI_UML_Label_Access is abstract; not overriding function Create_UML_Multiplicity_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Multiplicity_Labels.UMLDI_UML_Multiplicity_Label_Access is abstract; not overriding function Create_UML_Name_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Name_Labels.UMLDI_UML_Name_Label_Access is abstract; not overriding function Create_UML_Object_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Object_Diagrams.UMLDI_UML_Object_Diagram_Access is abstract; not overriding function Create_UML_Package_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Package_Diagrams.UMLDI_UML_Package_Diagram_Access is abstract; not overriding function Create_UML_Profile_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Profile_Diagrams.UMLDI_UML_Profile_Diagram_Access is abstract; not overriding function Create_UML_Redefines_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Redefines_Labels.UMLDI_UML_Redefines_Label_Access is abstract; not overriding function Create_UML_Shape (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Shapes.UMLDI_UML_Shape_Access is abstract; not overriding function Create_UML_State_Machine_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_State_Machine_Diagrams.UMLDI_UML_State_Machine_Diagram_Access is abstract; not overriding function Create_UML_State_Shape (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_State_Shapes.UMLDI_UML_State_Shape_Access is abstract; not overriding function Create_UML_Stereotype_Property_Value_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Stereotype_Property_Value_Labels.UMLDI_UML_Stereotype_Property_Value_Label_Access is abstract; not overriding function Create_UML_Style (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Styles.UMLDI_UML_Style_Access is abstract; not overriding function Create_UML_Typed_Element_Label (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Typed_Element_Labels.UMLDI_UML_Typed_Element_Label_Access is abstract; not overriding function Create_UML_Use_Case_Diagram (Self : not null access UMLDI_Factory) return AMF.UMLDI.UML_Use_Case_Diagrams.UMLDI_UML_Use_Case_Diagram_Access is abstract; end AMF.Factories.UMLDI_Factories;
aherd2985/Amass
Ada
1,885
ads
-- Copyright 2017 Jeff Foley. All rights reserved. -- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file. local json = require("json") name = "ZETAlytics" type = "api" function start() setratelimit(5) end function check() local c local cfg = datasrc_config() if cfg ~= nil then c = cfg.credentials end if (c ~= nil and c.key ~= nil and c.key ~= "") then return true end return false end function vertical(ctx, domain) local c local cfg = datasrc_config() if cfg ~= nil then c = cfg.credentials end if (c == nil or c.key == nil or c.key == "") then return end local resp local vurl = buildurl(domain, c.key) -- Check if the response data is in the graph database if (cfg.ttl ~= nil and cfg.ttl > 0) then resp = obtain_response(domain, cfg.ttl) end if (resp == nil or resp == "") then local err resp, err = request(ctx, { url=vurl, headers={['Content-Type']="application/json"}, }) if (err ~= nil and err ~= "") then return end if (cfg.ttl ~= nil and cfg.ttl > 0) then cache_response(domain, resp) end end local d = json.decode(resp) if (d == nil or #(d.results) == 0) then return end for i, r in pairs(d.results) do sendnames(ctx, r.qname) end end function buildurl(domain, key) return "https://zonecruncher.com/api/v1/subdomains?q=" .. domain .. "&token=" .. key end function sendnames(ctx, content) local names = find(content, subdomainre) if names == nil then return end local found = {} for i, v in pairs(names) do if found[v] == nil then newname(ctx, v) found[v] = true end end end
AdaCore/Ada_Drivers_Library
Ada
3,251
adb
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2015, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ with System.Machine_Code; use System.Machine_Code; with System; use System; package body Cortex_M.FPU is use ASCII; ---------- -- Sqrt -- ---------- function Sqrt (X : Float) return Float is Result : Float; begin Asm ("vsqrt.f32 %0, %1", Inputs => (Float'Asm_Input ("w", X)), -- %1 Outputs => (Float'Asm_Output ("=w", Result)), -- %0 Volatile => True); return Result; end Sqrt; ----------- -- FPSCR -- ----------- function FPSCR return Status_Control_Register is Result : Status_Control_Register; begin Asm ("VMRS r3, FPSCR" & ASCII.LF & ASCII.HT & "str r3, [%0]", Inputs => (Address'Asm_Input ("r", Result'Address)), -- %0 Volatile => True, Clobber => ("r3")); return Result; end FPSCR; end Cortex_M.FPU;
zhmu/ananas
Ada
6,246
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- S Y S T E M . P A C K _ 9 5 -- -- -- -- B o d y -- -- -- -- Copyright (C) 1992-2022, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ with System.Storage_Elements; with System.Unsigned_Types; package body System.Pack_95 is subtype Bit_Order is System.Bit_Order; Reverse_Bit_Order : constant Bit_Order := Bit_Order'Val (1 - Bit_Order'Pos (System.Default_Bit_Order)); subtype Ofs is System.Storage_Elements.Storage_Offset; subtype Uns is System.Unsigned_Types.Unsigned; subtype N07 is System.Unsigned_Types.Unsigned range 0 .. 7; use type System.Storage_Elements.Storage_Offset; use type System.Unsigned_Types.Unsigned; type Cluster is record E0, E1, E2, E3, E4, E5, E6, E7 : Bits_95; end record; for Cluster use record E0 at 0 range 0 * Bits .. 0 * Bits + Bits - 1; E1 at 0 range 1 * Bits .. 1 * Bits + Bits - 1; E2 at 0 range 2 * Bits .. 2 * Bits + Bits - 1; E3 at 0 range 3 * Bits .. 3 * Bits + Bits - 1; E4 at 0 range 4 * Bits .. 4 * Bits + Bits - 1; E5 at 0 range 5 * Bits .. 5 * Bits + Bits - 1; E6 at 0 range 6 * Bits .. 6 * Bits + Bits - 1; E7 at 0 range 7 * Bits .. 7 * Bits + Bits - 1; end record; for Cluster'Size use Bits * 8; for Cluster'Alignment use Integer'Min (Standard'Maximum_Alignment, 1 + 1 * Boolean'Pos (Bits mod 2 = 0) + 2 * Boolean'Pos (Bits mod 4 = 0)); -- Use maximum possible alignment, given the bit field size, since this -- will result in the most efficient code possible for the field. type Cluster_Ref is access Cluster; type Rev_Cluster is new Cluster with Bit_Order => Reverse_Bit_Order, Scalar_Storage_Order => Reverse_Bit_Order; type Rev_Cluster_Ref is access Rev_Cluster; ------------ -- Get_95 -- ------------ function Get_95 (Arr : System.Address; N : Natural; Rev_SSO : Boolean) return Bits_95 is A : constant System.Address := Arr + Bits * Ofs (Uns (N) / 8); C : Cluster_Ref with Address => A'Address, Import; RC : Rev_Cluster_Ref with Address => A'Address, Import; begin if Rev_SSO then case N07 (Uns (N) mod 8) is when 0 => return RC.E0; when 1 => return RC.E1; when 2 => return RC.E2; when 3 => return RC.E3; when 4 => return RC.E4; when 5 => return RC.E5; when 6 => return RC.E6; when 7 => return RC.E7; end case; else case N07 (Uns (N) mod 8) is when 0 => return C.E0; when 1 => return C.E1; when 2 => return C.E2; when 3 => return C.E3; when 4 => return C.E4; when 5 => return C.E5; when 6 => return C.E6; when 7 => return C.E7; end case; end if; end Get_95; ------------ -- Set_95 -- ------------ procedure Set_95 (Arr : System.Address; N : Natural; E : Bits_95; Rev_SSO : Boolean) is A : constant System.Address := Arr + Bits * Ofs (Uns (N) / 8); C : Cluster_Ref with Address => A'Address, Import; RC : Rev_Cluster_Ref with Address => A'Address, Import; begin if Rev_SSO then case N07 (Uns (N) mod 8) is when 0 => RC.E0 := E; when 1 => RC.E1 := E; when 2 => RC.E2 := E; when 3 => RC.E3 := E; when 4 => RC.E4 := E; when 5 => RC.E5 := E; when 6 => RC.E6 := E; when 7 => RC.E7 := E; end case; else case N07 (Uns (N) mod 8) is when 0 => C.E0 := E; when 1 => C.E1 := E; when 2 => C.E2 := E; when 3 => C.E3 := E; when 4 => C.E4 := E; when 5 => C.E5 := E; when 6 => C.E6 := E; when 7 => C.E7 := E; end case; end if; end Set_95; end System.Pack_95;
AdaCore/libadalang
Ada
314
adb
package Test is type My_Int is range 0 .. 20_000; type My_Float is digits 12; type My_Record is record A, B : My_Int; F : My_Float; end record; procedure Foo is E : My_Float; G : My_Record; begin E := G.F; pragma Test_Statement; end Foo; end Test;
reznikmm/matreshka
Ada
3,587
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Demos Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with FastCGI.Application; with Paste_Bin.Handlers; procedure Paste_Bin.Driver is begin FastCGI.Application.Initialize; FastCGI.Application.Execute (Paste_Bin.Handlers.Handler'Access); FastCGI.Application.Finalize; end Paste_Bin.Driver;
gitter-badger/libAnne
Ada
14,042
ads
with Generics.Numerics; use Generics.Numerics; package Numerics with Pure, Remote_Types is --@description Provides numeric types that are not included in Standard --@version 1.0 ------------------------- -- Short Short Integer -- ------------------------- subtype Short_Short_Natural is Short_Short_Integer range 0 .. Short_Short_Integer'Last; subtype Short_Short_Positive is Short_Short_Integer range 1 .. Short_Short_Integer'Last; subtype Short_Short_Negative is Short_Short_Integer range Short_Short_Integer'First .. -1; subtype Short_Short_Even is Short_Short_Integer with Dynamic_Predicate => Short_Short_Even mod 2 = 0; subtype Short_Short_Odd is Short_Short_Integer with Dynamic_Predicate => Short_Short_Odd mod 2 /= 0; function Image(Value : Short_Short_Integer) return String renames Short_Short_Integer'Image; function Wide_Image(Value : Short_Short_Integer) return Wide_String renames Short_Short_Integer'Wide_Image; function Wide_Wide_Image(Value : Short_Short_Integer) return Wide_Wide_String renames Short_Short_Integer'Wide_Wide_Image; ------------------- -- Short Integer -- ------------------- subtype Short_Natural is Short_Integer range 0 .. Short_Integer'Last; subtype Short_Positive is Short_Integer range 1 .. Short_Integer'Last; subtype Short_Negative is Short_Integer range Short_Integer'First .. -1; subtype Short_Even is Short_Integer with Dynamic_Predicate => Short_Even mod 2 = 0; subtype Short_Odd is Short_Integer with Dynamic_Predicate => Short_Odd mod 2 /= 0; function Image(Value : Short_Integer) return String renames Short_Integer'Image; function Wide_Image(Value : Short_Integer) return Wide_String renames Short_Integer'Wide_Image; function Wide_Wide_Image(Value : Short_Integer) return Wide_Wide_String renames Short_Integer'Wide_Wide_Image; ------------- -- Integer -- ------------- subtype Negative is Integer range Integer'First .. -1; subtype Even is Integer with Dynamic_Predicate => Even mod 2 = 0; subtype Odd is Integer with Dynamic_Predicate => Odd mod 2 /= 0; function Image(Value : Integer) return String renames Integer'Image; function Wide_Image(Value : Integer) return Wide_String renames Integer'Wide_Image; function Wide_Wide_Image(Value : Integer) return Wide_Wide_String renames Integer'Wide_Wide_Image; ------------------ -- Long Integer -- ------------------ subtype Long_Natural is Long_Integer range 0 .. Long_Integer'Last; subtype Long_Positive is Long_Integer range 1 .. Long_Integer'Last; subtype Long_Negative is Long_Integer range Long_Integer'First .. -1; subtype Long_Even is Long_Integer with Dynamic_Predicate => Long_Even mod 2 = 0; subtype Long_Odd is Long_Integer with Dynamic_Predicate => Long_Odd mod 2 /= 0; function Image(Value : Long_Integer) return String renames Long_Integer'Image; function Wide_Image(Value : Long_Integer) return Wide_String renames Long_Integer'Wide_Image; function Wide_Wide_Image(Value : Long_Integer) return Wide_Wide_String renames Long_Integer'Wide_Wide_Image; ----------------------- -- Long Long Integer -- ----------------------- subtype Long_Long_Natural is Long_Long_Integer range 0 .. Long_Long_Integer'Last; subtype Long_Long_Positive is Long_Long_Integer range 1 .. Long_Long_Integer'Last; subtype Long_Long_Negative is Long_Long_Integer range Long_Long_Integer'First .. -1; subtype Long_Long_Even is Long_Long_Integer with Dynamic_Predicate => Long_Long_Even mod 2 = 0; subtype Long_Long_Odd is Long_Long_Integer with Dynamic_Predicate => Long_Long_Odd mod 2 /= 0; function Image(Value : Long_Long_Integer) return String renames Long_Long_Integer'Image; function Wide_Image(Value : Long_Long_Integer) return Wide_String renames Long_Long_Integer'Wide_Image; function Wide_Wide_Image(Value : Long_Long_Integer) return Wide_Wide_String renames Long_Long_Integer'Wide_Wide_Image; ------------------------- -- Short Short Modular -- ------------------------- type Short_Short_Modular is mod 2**Short_Short_Integer'Size; function Image(Value : Short_Short_Modular) return String renames Short_Short_Modular'Image; function Wide_Image(Value : Short_Short_Modular) return Wide_String renames Short_Short_Modular'Wide_Image; function Wide_Wide_Image(Value : Short_Short_Modular) return Wide_Wide_String renames Short_Short_Modular'Wide_Wide_Image; ------------------- -- Short Modular -- ------------------- type Short_Modular is mod 2**Short_Integer'Size; function Image(Value : Short_Modular) return String renames Short_Modular'Image; function Wide_Image(Value : Short_Modular) return Wide_String renames Short_Modular'Wide_Image; function Wide_Wide_Image(Value : Short_Modular) return Wide_Wide_String renames Short_Modular'Wide_Wide_Image; ------------- -- Modular -- ------------- type Modular is mod 2**Integer'Size; function Image(Value : Modular) return String renames Modular'Image; function Wide_Image(Value : Modular) return Wide_String renames Modular'Wide_Image; function Wide_Wide_Image(Value : Modular) return Wide_Wide_String renames Modular'Wide_Wide_Image; ------------------ -- Long Modular -- ------------------ type Long_Modular is mod 2**Long_Integer'Size; function Image(Value : Long_Modular) return String renames Long_Modular'Image; function Wide_Image(Value : Long_Modular) return Wide_String renames Long_Modular'Wide_Image; function Wide_Wide_Image(Value : Long_Modular) return Wide_Wide_String renames Long_Modular'Wide_Wide_Image; ----------------------- -- Long Long Modular -- ----------------------- type Long_Long_Modular is mod 2**Long_Long_Integer'Size; function Image(Value : Long_Long_Modular) return String renames Long_Long_Modular'Image; function Wide_Image(Value : Long_Long_Modular) return Wide_String renames Long_Long_Modular'Wide_Image; function Wide_Wide_Image(Value : Long_Long_Modular) return Wide_Wide_String renames Long_Long_Modular'Wide_Wide_Image; ----------------------- -- Short Short Fixed -- ----------------------- type Short_Short_Fixed is delta 2.0/(2**Short_Short_Integer'Size) range Float(Short_Short_Integer'First) .. Float(Short_Short_Integer'Last); function Truncate is new Fixed_Truncate(Short_Short_Fixed); function Ceiling is new Fixed_Ceiling(Short_Short_Fixed); function Floor is new Fixed_Floor(Short_Short_Fixed); function "mod" is new Fixed_Modulus(Short_Short_Fixed); function "rem" is new Fixed_Remainder(Short_Short_Fixed); function Image(Value : Short_Short_Fixed) return String renames Short_Short_Fixed'Image; function Wide_Image(Value : Short_Short_Fixed) return Wide_String renames Short_Short_Fixed'Wide_Image; function Wide_Wide_Image(Value : Short_Short_Fixed) return Wide_Wide_String renames Short_Short_Fixed'Wide_Wide_Image; ----------------- -- Short Fixed -- ----------------- type Short_Fixed is delta 2.0/(2**Short_Integer'Size) range Float(Short_Integer'First) .. Float(Short_Integer'Last); function Truncate is new Fixed_Truncate(Short_Fixed); function Ceiling is new Fixed_Ceiling(Short_Fixed); function Floor is new Fixed_Floor(Short_Fixed); function "mod" is new Fixed_Modulus(Short_Fixed); function "rem" is new Fixed_Remainder(Short_Fixed); function Image(Value : Short_Fixed) return String renames Short_Fixed'Image; function Wide_Image(Value : Short_Fixed) return Wide_String renames Short_Fixed'Wide_Image; function Wide_Wide_Image(Value : Short_Fixed) return Wide_Wide_String renames Short_Fixed'Wide_Wide_Image; ----------- -- Fixed -- ----------- type Fixed is delta 2.0/(2**Integer'Size) range Float(Integer'First) .. Float(Integer'Last); function Truncate is new Fixed_Truncate(Fixed); function Ceiling is new Fixed_Ceiling(Fixed); function Floor is new Fixed_Floor(Fixed); function "mod" is new Fixed_Modulus(Fixed); function "rem" is new Fixed_Remainder(Fixed); function Image(Value : Fixed) return String renames Fixed'Image; function Wide_Image(Value : Fixed) return Wide_String renames Fixed'Wide_Image; function Wide_Wide_Image(Value : Fixed) return Wide_Wide_String renames Fixed'Wide_Wide_Image; ---------------- -- Long Fixed -- ---------------- type Long_Fixed is delta 2.0/(Long_Integer'Size) range Float(Integer'First) .. Float(Integer'Last); function Truncate is new Fixed_Truncate(Long_Fixed); function Ceiling is new Fixed_Ceiling(Long_Fixed); function Floor is new Fixed_Floor(Long_Fixed); function "mod" is new Fixed_Modulus(Long_Fixed); function "rem" is new Fixed_Remainder(Long_Fixed); function Image(Value : Long_Fixed) return String renames Long_Fixed'Image; function Wide_Image(Value : Long_Fixed) return Wide_String renames Long_Fixed'Wide_Image; function Wide_Wide_Image(Value : Long_Fixed) return Wide_Wide_String renames Long_Fixed'Wide_Wide_Image; ------------------- -- Short Decimal -- ------------------- type Short_Decimal is delta 10.0**(-Short_Float'Digits/2) digits Short_Float'Digits; function Truncate is new Decimal_Truncate(Short_Decimal); function Ceiling is new Decimal_Ceiling(Short_Decimal); function Floor is new Decimal_Floor(Short_Decimal); function "mod" is new Decimal_Modulus(Short_Decimal); function "rem" is new Decimal_Remainder(Short_Decimal); function Image(Value : Short_Decimal) return String renames Short_Decimal'Image; function Wide_Image(Value : Short_Decimal) return Wide_String renames Short_Decimal'Wide_Image; function Wide_Wide_Image(Value : Short_Decimal) return Wide_Wide_String renames Short_Decimal'Wide_Wide_Image; ------------- -- Decimal -- ------------- type Decimal is delta 10.0**(-Float'Digits/2) digits Float'Digits; function Truncate is new Decimal_Truncate(Decimal); function Ceiling is new Decimal_Ceiling(Decimal); function Floor is new Decimal_Floor(Decimal); function "mod" is new Decimal_Modulus(Decimal); function "rem" is new Decimal_Remainder(Decimal); function Image(Value : Decimal) return String renames Decimal'Image; function Wide_Image(Value : Decimal) return Wide_String renames Decimal'Wide_Image; function Wide_Wide_Image(Value : Decimal) return Wide_Wide_String renames Decimal'Wide_Wide_Image; ------------------ -- Long Decimal -- ------------------ type Long_Decimal is delta 10.0**(-Long_Float'Digits/2) digits Long_Float'Digits; function Truncate is new Decimal_Truncate(Long_Decimal); function Ceiling is new Decimal_Ceiling(Long_Decimal); function Floor is new Decimal_Floor(Long_Decimal); function "mod" is new Decimal_Modulus(Long_Decimal); function "rem" is new Decimal_Remainder(Long_Decimal); function Image(Value : Long_Decimal) return String renames Long_Decimal'Image; function Wide_Image(Value : Long_Decimal) return Wide_String renames Long_Decimal'Wide_Image; function Wide_Wide_Image(Value : Long_Decimal) return Wide_Wide_String renames Long_Decimal'Wide_Wide_Image; ----------------------- -- Long Long Decimal -- ----------------------- type Long_Long_Decimal is delta 10.0**(-Long_Long_Float'Digits/2) digits Long_Long_Float'Digits; function Truncate is new Decimal_Truncate(Long_Long_Decimal); function Ceiling is new Decimal_Ceiling(Long_Long_Decimal); function Floor is new Decimal_Floor(Long_Long_Decimal); function "mod" is new Decimal_Modulus(Long_Long_Decimal); function "rem" is new Decimal_Remainder(Long_Long_Decimal); function Image(Value : Long_Long_Decimal) return String renames Long_Long_Decimal'Image; function Wide_Image(Value : Long_Long_Decimal) return Wide_String renames Long_Long_Decimal'Wide_Image; function Wide_Wide_Image(Value : Long_Long_Decimal) return Wide_Wide_String renames Long_Long_Decimal'Wide_Wide_Image; ----------------- -- Short Float -- ----------------- function Truncate is new Float_Truncate(Short_Float); function Ceiling is new Float_Ceiling(Short_Float); function Floor is new Float_Floor(Short_Float); function "mod" is new Float_Modulus(Short_Float); function "rem" is new Float_Remainder(Short_Float); function Image(Value : Short_Float) return String renames Short_Float'Image; function Wide_Image(Value : Short_Float) return Wide_String renames Short_Float'Wide_Image; function Wide_Wide_Image(Value : Short_Float) return Wide_Wide_String renames Short_Float'Wide_Wide_Image; ----------- -- Float -- ----------- function Truncate is new Float_Truncate(Float); function Ceiling is new Float_Ceiling(Float); function Floor is new Float_Floor(Float); function "mod" is new Float_Modulus(Float); function "rem" is new Float_Remainder(Float); function Image(Value : Float) return String renames Float'Image; function Wide_Image(Value : Float) return Wide_String renames Float'Wide_Image; function Wide_Wide_Image(Value : Float) return Wide_Wide_String renames Float'Wide_Wide_Image; ---------------- -- Long Float -- ---------------- function Truncate is new Float_Truncate(Long_Float); function Ceiling is new Float_Ceiling(Long_Float); function Floor is new Float_Floor(Long_Float); function "mod" is new Float_Modulus(Long_Float); function "rem" is new Float_Remainder(Long_Float); function Image(Value : Long_Float) return String renames Long_Float'Image; function Wide_Image(Value : Long_Float) return Wide_String renames Long_Float'Wide_Image; function Wide_Wide_Image(Value : Long_Float) return Wide_Wide_String renames Long_Float'Wide_Wide_Image; --------------------- -- Long Long Float -- --------------------- function Truncate is new Float_Truncate(Long_Long_Float); function Ceiling is new Float_Ceiling(Long_Long_Float); function Floor is new Float_Floor(Long_Long_Float); function "mod" is new Float_Modulus(Long_Long_Float); function "rem" is new Float_Remainder(Long_Long_Float); function Image(Value : Long_Long_Float) return String renames Long_Long_Float'Image; function Wide_Image(Value : Long_Long_Float) return Wide_String renames Long_Long_Float'Wide_Image; function Wide_Wide_Image(Value : Long_Long_Float) return Wide_Wide_String renames Long_Long_Float'Wide_Wide_Image; end Numerics;
zhmu/ananas
Ada
6,489
adb
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- G N A T . E X C E P T I O N _ A C T I O N S -- -- -- -- B o d y -- -- -- -- Copyright (C) 2002-2022, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ with Ada.Unchecked_Conversion; with System; with System.Soft_Links; use System.Soft_Links; with System.Standard_Library; use System.Standard_Library; with System.Exception_Table; use System.Exception_Table; package body GNAT.Exception_Actions is Global_Action : Exception_Action; pragma Import (Ada, Global_Action, "__gnat_exception_actions_global_action"); pragma Atomic (Global_Action); -- Imported from Ada.Exceptions. Any change in the external name needs to -- be coordinated with a-exextr.adb. Global_Unhandled_Action : Exception_Action; pragma Import (Ada, Global_Unhandled_Action, "__gnat_exception_actions_global_unhandled_action"); pragma Atomic (Global_Unhandled_Action); -- Imported from Ada.Exceptions. Any change in the external name needs to -- be coordinated with a-exextr.adb. Raise_Hook_Initialized : Boolean; pragma Import (Ada, Raise_Hook_Initialized, "__gnat_exception_actions_initialized"); function To_Raise_Action is new Ada.Unchecked_Conversion (Exception_Action, Raise_Action); -- ??? Would be nice to have this in System.Standard_Library function To_Data is new Ada.Unchecked_Conversion (Exception_Id, Exception_Data_Ptr); function To_Id is new Ada.Unchecked_Conversion (Exception_Data_Ptr, Exception_Id); ---------------------------- -- Register_Global_Action -- ---------------------------- procedure Register_Global_Action (Action : Exception_Action) is begin Global_Action := Action; end Register_Global_Action; -------------------------------------- -- Register_Global_Unhandled_Action -- -------------------------------------- procedure Register_Global_Unhandled_Action (Action : Exception_Action) is begin Global_Unhandled_Action := Action; end Register_Global_Unhandled_Action; ------------------------ -- Register_Id_Action -- ------------------------ procedure Register_Id_Action (Id : Exception_Id; Action : Exception_Action) is begin if Id = Null_Id then raise Program_Error; end if; Lock_Task.all; To_Data (Id).Raise_Hook := To_Raise_Action (Action); Raise_Hook_Initialized := True; Unlock_Task.all; end Register_Id_Action; --------------- -- Core_Dump -- --------------- procedure Core_Dump (Occurrence : Exception_Occurrence) is separate; -------------------------- -- Is_Foreign_Exception -- -------------------------- function Is_Foreign_Exception (E : Exception_Occurrence) return Boolean is Foreign_Exception : aliased Exception_Data; pragma Import (Ada, Foreign_Exception, "system__exceptions__foreign_exception"); begin return (To_Data (Exception_Identity (E)) = Foreign_Exception'Unchecked_Access); end Is_Foreign_Exception; ---------------- -- Name_To_Id -- ---------------- function Name_To_Id (Name : String) return Exception_Id is begin return To_Id (Internal_Exception (Name, Create_If_Not_Exist => False)); end Name_To_Id; --------------------------------- -- Registered_Exceptions_Count -- --------------------------------- function Registered_Exceptions_Count return Natural renames System.Exception_Table.Registered_Exceptions_Count; ------------------------------- -- Get_Registered_Exceptions -- ------------------------------- -- This subprogram isn't an iterator to avoid concurrency problems, -- since the exceptions are registered dynamically. Since we have to lock -- the runtime while computing this array, this means that any callback in -- an active iterator would be unable to access the runtime. procedure Get_Registered_Exceptions (List : out Exception_Id_Array; Last : out Integer) is Ids : Exception_Data_Array (List'Range); begin Get_Registered_Exceptions (Ids, Last); for L in List'First .. Last loop List (L) := To_Id (Ids (L)); end loop; end Get_Registered_Exceptions; end GNAT.Exception_Actions;
charlie5/lace
Ada
3,860
ads
with freetype.Face, freetype.charMap; private with ada.Containers.Vectors; package openGL.Glyph.Container -- -- Contains the post processed Glyph objects. -- is type Item is tagged private; type Glyph_view is access all Glyph.item'Class; --------- -- Forge -- function to_glyph_Container (parent_Face : in freetype.Face.view) return glyph.Container.item; -- -- parent_Face: The Freetype face. procedure destruct (Self : in out Item); -------------- -- Attributes -- function CharMap (Self : access Item; Encoding : in freeType_c.FT_Encoding) return Boolean; -- -- Sets the character map for the face. -- -- Encoding: The Freetype encoding symbol. -- -- Returns True if charmap was valid and set correctly. function FontIndex (Self : in Item; Character : in freetype.charMap.characterCode) return Natural; -- -- Get the font index of the input character. -- -- Character: The character code of the requested glyph in the current encoding (eg apple roman). -- -- Returns the font index for the character. procedure add (Self : in out Item; Glyph : in Glyph_view; Character : in freetype.charMap.characterCode); -- -- Adds a glyph to this glyph list. -- -- Glyph: The FTGlyph to be inserted into the container. -- Character: The char code of the glyph NOT the glyph index. function Glyph (Self : in Item; Character : in freetype.charMap.characterCode) return Glyph_view; -- -- Get a glyph from the glyph list. -- -- Character: The char code of the glyph NOT the glyph index. -- -- Returns a Glyph or null is it hasn't been loaded. function BBox (Self : in Item; Character : in freetype.charMap.characterCode) return Bounds; -- -- Get the bounding box for a character. -- -- Character: The char code of the glyph NOT the glyph index. function Advance (Self : in Item; Character : in freetype.charMap.characterCode; nextCharacterCode : in freetype.charMap.characterCode) return Real; -- -- Character: Glyph index of the character. -- nextCharacterCode: The next glyph in a string. -- -- Returns the kerned advance width for a glyph. function Error (Self : in Item) return freetype_c.FT_Error; -- -- Queries the glyph container for errors. -- -- Returns the current error code. -------------- -- Operations -- function render (Self : access Item; Character : in freetype.charMap.characterCode; nextCharacterCode : in freetype.charMap.characterCode; penPosition : in Vector_3; renderMode : in Integer) return Vector_3; -- -- Renders a character. -- -- Character: The glyph to be Rendered. -- nextCharacterCode: The next glyph in the string. Used for kerning. -- penPosition: The position to Render the glyph. -- renderMode: Render mode to display. -- -- Returns the distance to advance the pen position after rendering, private type charMap_view is access all freetype.charMap.item'class; package glyph_Vectors is new ada.Containers.Vectors (Positive, Glyph_view); type Item is tagged record Face : freetype.Face.view; -- The FTGL face. charMap : charMap_view; -- The character map object associated with the current face. Glyphs : glyph_Vectors.Vector; -- A structure to hold the glyphs. Err : freeType_c.FT_Error; -- Current error code. Zero means no error. end record; end openGL.Glyph.Container;
faelys/natools
Ada
1,656
ads
------------------------------------------------------------------------------ -- Copyright (c) 2014, Natacha Porté -- -- -- -- Permission to use, copy, modify, and distribute this software for any -- -- purpose with or without fee is hereby granted, provided that the above -- -- copyright notice and this permission notice appear in all copies. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES -- -- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF -- -- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR -- -- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES -- -- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN -- -- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF -- -- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE. -- ------------------------------------------------------------------------------ ------------------------------------------------------------------------------ -- Natools.Storage_Pools provides stuff related to storage pools. Currently -- -- that means only a dummy access type to reach the default storage pool. -- ------------------------------------------------------------------------------ package Natools.Storage_Pools is pragma Preelaborate (Storage_Pools); type Access_In_Default_Pool is access Boolean; end Natools.Storage_Pools;
ohenley/ada-util
Ada
3,996
adb
----------------------------------------------------------------------- -- util-commands -- Support to make command line tools -- Copyright (C) 2017 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Command_Line; with Ada.Characters.Handling; package body Util.Commands is -- ------------------------------ -- Get the number of arguments available. -- ------------------------------ overriding function Get_Count (List : in Default_Argument_List) return Natural is Count : constant Natural := Ada.Command_Line.Argument_Count; begin if Count > List.Offset then return Count - List.Offset; else return 0; end if; end Get_Count; -- ------------------------------ -- Get the argument at the given position. -- ------------------------------ overriding function Get_Argument (List : in Default_Argument_List; Pos : in Positive) return String is begin return Ada.Command_Line.Argument (Pos + List.Offset); end Get_Argument; -- ------------------------------ -- Get the command name. -- ------------------------------ function Get_Command_Name (List : in Default_Argument_List) return String is pragma Unreferenced (List); begin return Ada.Command_Line.Command_Name; end Get_Command_Name; -- ------------------------------ -- Set the argument list to the given string and split the arguments. -- ------------------------------ procedure Initialize (List : in out String_Argument_List; Line : in String) is First : Natural := Line'First; begin List.Length := Line'Length; List.Line (1 .. Line'Length) := Line; List.Count := 0; loop while First <= Line'Length and then Ada.Characters.Handling.Is_Space (List.Line (First)) loop First := First + 1; end loop; exit when First > Line'Length; List.Start_Pos (List.Count) := First; while First <= Line'Length and then not Ada.Characters.Handling.Is_Space (List.Line (First)) loop First := First + 1; end loop; List.End_Pos (List.Count) := First - 1; List.Count := List.Count + 1; end loop; if List.Count > 0 then List.Count := List.Count - 1; end if; end Initialize; -- ------------------------------ -- Get the number of arguments available. -- ------------------------------ overriding function Get_Count (List : in String_Argument_List) return Natural is begin return List.Count; end Get_Count; -- ------------------------------ -- Get the argument at the given position. -- ------------------------------ overriding function Get_Argument (List : in String_Argument_List; Pos : in Positive) return String is begin return List.Line (List.Start_Pos (Pos) .. List.End_Pos (Pos)); end Get_Argument; -- ------------------------------ -- Get the command name. -- ------------------------------ overriding function Get_Command_Name (List : in String_Argument_List) return String is begin return List.Line (List.Start_Pos (0) .. List.End_Pos (0)); end Get_Command_Name; end Util.Commands;
AdaCore/gpr
Ada
4,007
adb
-- -- Copyright (C) 2019-2023, AdaCore -- -- SPDX-License-Identifier: Apache-2.0 -- with Ada.Text_IO; use Ada.Text_IO; with GPR2.Log; with GPR2.Message; with GPR2.Source_Reference; procedure Main is use GPR2; procedure Display_Status (Log : GPR2.Log.Object); -- Display log status -------------------- -- Display_Status -- -------------------- procedure Display_Status (Log : GPR2.Log.Object) is begin New_Line; Put_Line ("Log is empty: " & Boolean'Image (Log.Is_Empty)); Put_Line ("Has_Element (info) " & Boolean'Image (Log.Has_Element (Information => True, Warning => False, Error => False, Read => False, Unread => True))); Put_Line ("Has_Element (warn) " & Boolean'Image (Log.Has_Element (Information => False, Warning => True, Error => False, Read => False, Unread => True))); Put_Line ("Has_Element (error) " & Boolean'Image (Log.Has_Element (Information => False, Warning => False, Error => True, Read => False, Unread => True))); Put_Line ("Has_Element (read) " & Boolean'Image (Log.Has_Element (Information => True, Warning => True, Error => True, Read => True, Unread => False))); Put_Line ("Has_Element (unread) " & Boolean'Image (Log.Has_Element (Information => True, Warning => True, Error => True, Read => False, Unread => True))); end Display_Status; Log : GPR2.Log.Object; begin Put_Line ("Log is empty: " & Boolean'Image (Log.Is_Empty)); Log.Append (Message.Create (Message.Warning, "test warning", Source_Reference.Create ("/ada/prj1.gpr", 1, 2))); Log.Append (Message.Create (Message.Error, "test error", Source_Reference.Create ("/ada/prj2.gpr", 2, 3))); Log.Append (Message.Create (Message.Information, "test information", Source_Reference.Create ("/ada/prj3.gpr", 3, 4))); Display_Status (Log); -- Read errors for E in Log.Iterate (Error => True, Warning => False, Information => False, Read => False, Unread => True) loop Put_Line (Log (E).Format); end loop; Display_Status (Log); -- Read warning for E in Log.Iterate (Error => False, Warning => True, Information => False, Read => False, Unread => True) loop Put_Line (Log (E).Format); end loop; Display_Status (Log); -- Read information for E in Log.Iterate (Error => False, Warning => False, Information => True, Read => False, Unread => True) loop Put_Line (Log (E).Format); end loop; Display_Status (Log); end Main;
reznikmm/matreshka
Ada
3,669
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Elements; package ODF.DOM.Table_Dde_Link_Elements is pragma Preelaborate; type ODF_Table_Dde_Link is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Table_Dde_Link_Access is access all ODF_Table_Dde_Link'Class with Storage_Size => 0; end ODF.DOM.Table_Dde_Link_Elements;
LiberatorUSA/GUCEF
Ada
1,551
adb
package body agar.gui.widget.fixed is package cbinds is procedure put (fixed : fixed_access_t; child : child_access_t; x : c.int; y : c.int); pragma import (c, put, "AG_FixedPut"); procedure size (fixed : fixed_access_t; child : child_access_t; width : c.int; height : c.int); pragma import (c, size, "AG_FixedSize"); procedure move (fixed : fixed_access_t; child : child_access_t; x : c.int; y : c.int); pragma import (c, move, "AG_FixedMove"); end cbinds; procedure put (fixed : fixed_access_t; child : child_access_t; x : natural; y : natural) is begin cbinds.put (fixed => fixed, child => child, x => c.int (x), y => c.int (y)); end put; procedure size (fixed : fixed_access_t; child : child_access_t; width : positive; height : positive) is begin cbinds.size (fixed => fixed, child => child, width => c.int (width), height => c.int (height)); end size; procedure move (fixed : fixed_access_t; child : child_access_t; x : natural; y : natural) is begin cbinds.move (fixed => fixed, child => child, x => c.int (x), y => c.int (y)); end move; function widget (fixed : fixed_access_t) return widget_access_t is begin return fixed.widget'unchecked_access; end widget; end agar.gui.widget.fixed;
wookey-project/ewok-legacy
Ada
2,643
adb
-- -- Copyright 2018 The wookey project team <[email protected]> -- - Ryad Benadjila -- - Arnauld Michelizza -- - Mathieu Renard -- - Philippe Thierry -- - Philippe Trebuchet -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. -- -- with soc.interrupts; use soc.interrupts; with ewok.posthook; with ewok.softirq; with ewok.dma; with ewok.dma.interfaces; with soc.dma; with soc.nvic; package body ewok.isr with spark_mode => off is procedure postpone_isr (intr : in soc.interrupts.t_interrupt; handler : in ewok.interrupts.t_interrupt_handler_access; task_id : in ewok.tasks_shared.t_task_id) is status : unsigned_32 := 0; data : unsigned_32 := 0; isr_params : ewok.softirq.t_isr_parameters; begin -- Acknowledge interrupt: -- - DMAs are managed by the kernel -- - Devices managed by user tasks should use the posthook mechanism -- to acknowledge interrupt (in order to avoid bursts). Note that -- posthook execution is mandatory for hardware devices that wait for -- a quick answer from the driver. It permit to execute some -- instructions (reading and writing registers) and to return some -- results in the 'args' parameter. #if CONFIG_KERNEL_DMA_ENABLE if soc.dma.soc_is_dma_irq (intr) then status := ewok.dma.interfaces.dma_get_status (task_id, intr); ewok.dma.clear_dma_interrupts (task_id, intr); else ewok.posthook.exec (intr, status, data); end if; #else ewok.posthook.exec (intr, status, data); #end if; -- All user ISR have their Pending IRQ bit clean here soc.nvic.clear_pending_irq (soc.nvic.to_irq_number (intr)); -- Pushing the request for further treatment by softirq isr_params.handler := ewok.interrupts.to_system_address (handler); isr_params.interrupt := intr; isr_params.posthook_status := status; isr_params.posthook_data := data; ewok.softirq.push_isr (task_id, isr_params); return; end postpone_isr; end ewok.isr;
ytomino/vampire
Ada
41,079
adb
-- The Village of Vampire by YT, このソースコードはNYSLです with Ada.Calendar; with Ada.Containers.Generic_Array_Sort; with Ada.Numerics.Distributions; with Ada.Strings.Unbounded; with Vampire.Villages.Teaming; procedure Vampire.Villages.Advance ( Village : in out Village_Type; Now : in Ada.Calendar.Time; Generator : aliased in out Ada.Numerics.MT19937.Generator; Changed : out Boolean; List_Changed : out Boolean) is use Person_Records; use Messages; use type Ada.Calendar.Time; subtype People_Index is Person_Index range Person_Index'First .. Village.People.Last_Index; function People_Random is new Ada.Numerics.Distributions.Linear_Discrete_Random ( Ada.Numerics.MT19937.Unsigned_32, People_Index, Ada.Numerics.MT19937.Generator, Ada.Numerics.MT19937.Random_32); -- 日付変更 procedure Increment_Today is begin Village.Today := Village.Today + 1; for Position in Person_Index'First .. Village.People.Last_Index loop declare P : Person_Type renames Village.People.Reference (Position); New_Record : Person_Record := P.Records.Reference (P.Records.Last_Index); begin New_Record.Vote := No_Person; New_Record.Provisional_Vote := No_Person; New_Record.Candidate := True; New_Record.Target := No_Person; New_Record.Special := False; if New_Record.State /= Died then New_Record.Note := Ada.Strings.Unbounded.Null_Unbounded_String; end if; Append (P.Records, New_Record); P.Commited := False; end; end loop; end Increment_Today; -- 一次開票 procedure Preliminary_Vote ( Village : in out Village_Type; Time : in Ada.Calendar.Time; Changed : in out Boolean) is type Voted_Array is array (Person_Index range <>) of Natural; procedure Sort is new Ada.Containers.Generic_Array_Sort ( Person_Index, Natural, Voted_Array); Voted, Sort_Voted : Voted_Array (Person_Index'First .. Village.People.Last_Index) := (others => 0); Candidates : Natural := 0; Max : Natural := 0; Limit : Natural := 0; begin -- 集計 for I in Person_Index'First .. Village.People.Last_Index loop if Village.People.Constant_Reference (I).Records.Constant_Reference (Village.Today).State /= Died then declare Target : Person_Index'Base := Village.People.Constant_Reference (I).Records.Constant_Reference (Village.Today).Provisional_Vote; begin if Target in Person_Index'First .. Village.People.Last_Index then if Voted (Target) = 0 then Candidates := Candidates + 1; end if; Voted (Target) := Voted (Target) + 1; if Voted (Target) > Max then Max := Voted (Target); end if; end if; end; end if; end loop; -- 候補が2名以上いる場合に適用 if Candidates >= 2 then -- 同率2位までを候補とする Sort_Voted := Voted; Sort (Sort_Voted); Limit := Sort_Voted (Sort_Voted'Last - 1); for I in Person_Index'First .. Village.People.Last_Index loop declare The_Person : Person_Type renames Village.People.Reference (I); The_Record : Person_Record renames The_Person.Records.Reference (Village.Today); begin if The_Record.State /= Died then The_Record.Candidate := Voted (I) >= Limit; end if; end; end loop; -- 選ばれた候補以外に投票していた人は棄権に戻す for I in Person_Index'First .. Village.People.Last_Index loop declare V : Person_Index'Base renames Village.People.Reference (I).Records.Reference (Village.Today).Vote; begin if V >= 0 and then not Village.People.Constant_Reference (V).Records.Constant_Reference (Village.Today).Candidate then V := No_Person; end if; end; end loop; Append ( Village.Messages, Message'( Kind => Preliminary_Vote, Day => Village.Today, Time => Time, Subject => No_Person, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); Changed := True; -- 変更を保存 end if; end Preliminary_Vote; -- 処刑対象 function Get_Execution (Execution_Day : Natural) return Person_Index'Base is Voted : array (People_Index) of Natural := (others => 0); Max : Natural := 0; begin for I in People_Index loop if Village.People.Constant_Reference (I).Records.Constant_Reference (Execution_Day).State /= Died then declare V : constant Person_Index'Base := Village.People.Constant_Reference (I).Records.Constant_Reference (Execution_Day).Vote; begin if V >= 0 then Voted (V) := Voted (V) + 1; if Voted (V) > Max then Max := Voted (V); end if; end if; end; end if; end loop; if Max > 0 then declare X : People_Index; begin loop X := People_Random (Generator); if Voted (X) = Max then return X; end if; end loop; end; end if; return No_Person; end Get_Execution; -- 全員会話(妨害を受ける) procedure Night_Talk_All ( Village : in out Village_Type; Target_Day : in Natural; Time : in Ada.Calendar.Time) is begin for Rank in Vampire_Role loop declare Vampire : constant Person_Index'Base := Village.Find_Superman (Rank); begin if Vampire /= No_Person then declare Vampire_Person : Person_Type renames Village.People.Constant_Reference (Vampire); begin if Vampire_Person.Records.Constant_Reference (Village.Today).State /= Died and then not Vampire_Person.Records.Constant_Reference (Target_Day).Note.Is_Null then Night_Talk ( Village, Vampire, Vampire_Person.Records.Constant_Reference (Target_Day).Note.Constant_Reference, Time); end if; end; end if; end; end loop; end Night_Talk_All; -- 二次襲撃先の条件を満たしているか function Is_Secondary_Attackable (I : Person_Index) return Boolean is begin return Village.People.Constant_Reference (I).Role not in Vampire_Role and then Village.People.Constant_Reference (I).Role /= Gremlin and then Village.People.Constant_Reference (I).Records.Constant_Reference (Village.Today).State = Normal; end Is_Secondary_Attackable; -- 襲撃 procedure Attack ( Executed : in Person_Index'Base; -- 処刑された人 Canceled : in Person_Index'Base; -- 二次襲撃キャンセル対象 Infection_Only_In_First : in Boolean; -- 初日感染 The_Hunter : in Person_Index'Base; -- 猟師 The_Vampire : in Person_Index; -- 襲撃の主体 Night_State : in Person_State; -- 主体の状態 Attacked : out Boolean; -- 主体となって襲撃したかどうか(護衛されたかどうかは無関係) Guard : in Person_Index'Base; -- 猟師が護衛している人 Silver_Bullet : in out Boolean; -- 銀の弾丸 Guard_Succeed : in out Boolean) -- 護衛結果 is Vampire_Person : Person_Type renames Village.People.Constant_Reference (The_Vampire); begin Attacked := False; if Vampire_Person.Records.Constant_Reference (Village.Today).State /= Died and then ( Vampire_Person.Role in Vampire_Role or else Night_State = Infected) then declare Target : Person_Index'Base := Vampire_Person.Records.Constant_Reference (Village.Today - 1).Target; Result : Vampire_Message_Kind := Vampire_Infection; Hunter_Result : Message_Kind; begin if Vampire_Person.Role not in Vampire_Role then -- 吸血鬼以外(感染夜間職)の襲撃先 if Target = Executed or else Target = Canceled or else Target = No_Person then if Target = Canceled then -- 襲撃がキャンセルされたことの通知 Append ( Village.Messages, Message'( Kind => Action_Vampire_Canceled, Day => Village.Today, Time => Now, Subject => The_Vampire, Target => Target, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; Target := No_Person; -- キャンセル対象または処刑対象を襲撃しようとした場合、他に振り替え -- 感染時点で使われた視線の中から未感染者を優先 Find_Gaze : for I in reverse Message_Index'First .. Village.Messages.Last_Index loop declare Message : Villages.Message renames Village.Messages.Constant_Reference (I); begin if Message.Kind = Action_Vampire_Gaze and then Vampire_Person.Records.Constant_Reference (Message.Day).State = Infected -- 視線タイミングで感染していた? and then Message.Target /= Executed and then Message.Target /= Canceled and then Is_Secondary_Attackable (Message.Target) then Target := Message.Target; exit Find_Gaze; end if; end; end loop Find_Gaze; if Target = No_Person then -- 棄権はできない、ランダム(未感染者を優先)で襲う loop Target := People_Random (Generator); exit when Target /= The_Vampire and then Is_Secondary_Attackable (Target); end loop; end if; end if; end if; if Target /= No_Person and then Village.People.Constant_Reference (Target).Records.Constant_Reference (Village.Today).State /= Died then Attacked := True; if Vampire_Person.Role in Vampire_Role and then not Infection_Only_In_First then -- 吸血鬼の襲撃タイプ選択 case Village.Attack is when Two | Nocturnal_Chain_Infecting => for Rank2 in Person_Role'Succ (Vampire_Person.Role) .. Vampire_J loop declare Vampire2 : constant Person_Index'Base := Find_Superman (Village, Rank2); begin if Vampire2 >= 0 and then Village.People.Constant_Reference (Vampire2).Records.Constant_Reference (Village.Today).State /= Died and then Target = Village.People.Constant_Reference (Vampire2).Records.Constant_Reference (Village.Today - 1).Target then Result := Vampire_Murder; end if; end; end loop; when Unanimity => Result := Vampire_Murder; for Rank2 in Vampire_Role loop declare Vampire2 : constant Person_Index'Base := Find_Superman (Village, Rank2); begin if Vampire2 >= 0 and then Village.People.Constant_Reference (Vampire2).Records.Constant_Reference (Village.Today).State /= Died and then Target /= Village.People.Constant_Reference (Vampire2).Records.Constant_Reference (Village.Today - 1).Target then Result := Vampire_Infection; end if; end; end loop; end case; -- 数奇な運命の村人は常に感染 if Village.Unfortunate = Infected_Only and then Village.People.Constant_Reference (Target).Role = Unfortunate_Inhabitant then Result := Vampire_Infection; end if; end if; if Guard /= Target then -- 襲撃成功、護衛失敗 if Village.People.Constant_Reference (Target).Role = Gremlin then -- 妖魔 Result := Vampire_Failed; else if Result = Vampire_Murder then Village.People.Reference (Target).Records.Reference (Village.Today).State := Died; Hunter_Result := Hunter_Killed_With_Silver; else if Village.People.Constant_Reference (Target).Role not in Vampire_Role then Village.People.Reference (Target).Records.Reference (Village.Today).State := Infected; end if; if Guard /= No_Person then Hunter_Result := Hunter_Guard_With_Silver; else Hunter_Result := Hunter_Infected_With_Silver; end if; end if; if Target = The_Hunter and then Silver_Bullet and then Village.Hunter_Silver_Bullet = Target_And_Self then -- 相打ち Guard_Succeed := True; Silver_Bullet := False; Village.People.Reference (The_Vampire).Records.Reference (Village.Today).State := Died; pragma Assert (not Infection_Only_In_First); Append ( Village.Messages, Message'( Kind => Hunter_Result, Day => Village.Today, Time => Now, Subject => The_Hunter, Target => Guard, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); Result := Message_Kind'Succ (Result); -- _Killed end if; end if; else -- 護衛成功 Guard_Succeed := True; if Silver_Bullet then Silver_Bullet := False; Village.People.Reference (The_Vampire).Records.Reference (Village.Today).State := Died; Hunter_Result := Hunter_Guard_With_Silver; Result := Vampire_Failed_And_Killed; else Hunter_Result := Hunter_Guard; Result := Vampire_Failed; end if; if not Infection_Only_In_First then Append ( Village.Messages, Message'( Kind => Hunter_Result, Day => Village.Today, Time => Now, Subject => The_Hunter, Target => Target, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; end if; -- 吸血鬼側のメッセージ if Infection_Only_In_First then case Result is when Vampire_Infection => Result := Vampire_Infection_In_First; when Vampire_Failed => Result := Vampire_Failed_In_First; when Vampire_Infection_In_First | Vampire_Failed_In_First | Vampire_Murder | Vampire_Murder_And_Killed | Vampire_Infection_And_Killed | Vampire_Failed_And_Killed => raise Program_Error; end case; end if; Append ( Village.Messages, Message'( Kind => Result, Day => Village.Today, Time => Now, Subject => The_Vampire, Target => Target, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; end; end if; end Attack; Gremlin_Kill_Astronomer, Gremlin_Kill_Doctor : Boolean := False; begin case Village.State is when Prologue => Changed := False; List_Changed := False; -- 直接弄ってのリセット補助 if Is_Empty (Village.Messages) then Append ( Village.Messages, Message'( Kind => Introduction, Day => Village.Today, Time => Now, Subject => No_Person, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); Changed := True; end if; -- 強制キック declare Acted : Villages.Message_Counts renames Villages.Count_Messages(Village, 0); begin for I in reverse People_Index loop if Now - Acted(I).Last_Action_Time >= Escape_Duration(Village) then Escape(Village, I, Now); Changed := True; List_Changed := True; end if; end loop; end; -- 全員がコミットすると開始 if Commit_Finished(Village) then -- 日付を更新 Village.Dawn := Now - Village.Night_Duration; Increment_Today; Village.State := Playing; Village.Time := Daytime; -- 常に昼スタート -- 能力決定 declare Sets : Teaming.Role_Set_Array renames Teaming.Possibilities ( People_Count => Village.People.Length, Male_And_Female => Village.Male_And_Female, Execution => Village.Execution, Formation => Village.Formation, Unfortunate => Village.Unfortunate, Monster_Side => Village.Monster_Side); Set : Teaming.Role_Set renames Teaming.Select_Set ( Sets => Sets, Appearance => Village.Appearance, Generator => Generator); Victim : access Person_Role := null; begin if Village.Execution = Dummy_Killed_And_From_First then Victim := Village.Dummy_Role'Access; end if; Teaming.Shuffle ( People => Village.People, Victim => Victim, Set => Set, Generator => Generator); end; Append ( Village.Messages, Message'( Kind => Breakdown, Day => Village.Today, Time => Now, Subject => No_Person, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); -- 初日犠牲者有りの時はひとりを観測済み if Village.Execution = Dummy_Killed_And_From_First then declare The_Astronomer : constant Person_Index'Base := Village.Find_Superman (Astronomer); Target : Person_Index'Base; begin if The_Astronomer >= 0 then loop Target := People_Random (Generator); case Village.People.Constant_Reference (Target).Role is when Inhabitant | Loved_Inhabitant | Unfortunate_Inhabitant | Detective | Doctor | Astronomer | Hunter | Lover | Sweetheart_M | Sweetheart_F | Servant => exit; when Vampire_Role | Gremlin => null; end case; end loop; Append ( Village.Messages, Message'( Kind => Astronomer_Observation, Day => Village.Today, Time => Now, Subject => The_Astronomer, Target => Target, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; end; end if; -- 使徒が吸血鬼を知る if Village.Servant_Knowing /= None then declare The_Servant : constant Person_Index'Base := Find_Superman(Village, Servant); begin if The_Servant >= 0 then if Village.Servant_Knowing /= None then declare Kind : Message_Kind; begin case Village.Servant_Knowing is when None => raise Program_Error; when Vampire_K => Kind := Servant_Knew_Vampire_K; when All_Vampires => Kind := Servant_Knew_Vampires; end case; Append ( Village.Messages, Message'( Kind => Kind, Day => Village.Today, Time => Now, Subject => The_Servant, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end; end if; end if; end; end if; -- 探偵が初日犠牲者の役を知る if Village.Execution = Dummy_Killed_And_From_First then declare The_Detective : constant Person_Index'Base := Find_Superman (Village, Detective); begin if The_Detective >= 0 then Append ( Village.Messages, Message'( Kind => Detective_Survey_Victim, Day => Village.Today, Time => Now, Subject => The_Detective, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; end; end if; -- 更新通知 Changed := True; List_Changed := True; end if; when Playing => declare function Finished return Boolean is Inhabitant_Count, Vampire_Count : Natural := 0; begin for Position in People_Index loop if Village.People.Constant_Reference (Position).Records.Constant_Reference (Village.Today).State = Normal and then not Village.People.Constant_Reference (Position).Commited then case Village.People.Constant_Reference(Position).Role is when Gremlin => null; when Vampire_Role => Vampire_Count := Vampire_Count + 1; when others => Inhabitant_Count := Inhabitant_Count + 1; end case; end if; end loop; return (Vampire_Count = 0) or else (Inhabitant_Count <= Vampire_Count); end Finished; Daytime_To_Vote, Vote_To_Night, Night_To_Daytime : Boolean := False; Infection_In_First, Preliminary_Voting : Boolean := False; Executed : Person_Index'Base; begin case Village.Time is when Night => if Now >= Village.Night_To_Daytime then Night_To_Daytime := True; end if; when Daytime => -- 初日感染は飛ばさない if Village.Execution = Infection_And_From_First and then Village.Today = 1 and then Now >= Village.Infection_In_First_Time and then not Village.Infected_In_First then Infection_In_First := True; end if; -- 更新 if Now >= Village.Daytime_To_Vote or else Commit_Finished (Village) then Daytime_To_Vote := True; if Village.Day_Duration >= 24 * 60 * 60.0 or else Vote_Finished (Village) or else Village.Vote_State = Disallowed then Vote_To_Night := True; if Village.Night_Duration = 0.0 then Night_To_Daytime := True; end if; end if; elsif Village.Vote = Preliminary_And_Final and then Now >= Village.Preliminary_Vote_Time and then Village.Vote_State = Allowed_For_Preliminary then Preliminary_Voting := True; -- コミットで飛ぶ end if; when Vote => if Now >= Village.Vote_To_Night or else Vote_Finished (Village) then Vote_To_Night := True; if Village.Night_Duration = 0.0 then Night_To_Daytime := True; end if; end if; end case; Changed := Daytime_To_Vote or else Vote_To_Night or else Night_To_Daytime; List_Changed := Vote_To_Night; -- 初日感染 if Infection_In_First then Night_Talk_All (Village, Village.Today, Now); -- 会話 declare The_Hunter : constant Person_Index'Base := Village.Find_Superman (Hunter); Guard : Person_Index'Base := No_Person; Silver_Bullet : Boolean := False; Guard_Succeed : Boolean := False; Attacked : Boolean; begin if The_Hunter /= No_Person then pragma Assert ( Village.People.Constant_Reference (The_Hunter).Records.Constant_Reference (Village.Today).State = Normal); Guard := Village.People.Constant_Reference (The_Hunter).Records.Constant_Reference (Village.Today - 1).Target; end if; for Rank in Vampire_Role loop declare The_Vampire : constant Person_Index'Base := Village.Find_Superman (Rank); begin if The_Vampire /= No_Person then Attack ( Executed => No_Person, Canceled => No_Person, Infection_Only_In_First => True, The_Vampire => The_Vampire, Night_State => Infected, Attacked => Attacked, The_Hunter => The_Hunter, Guard => Guard, Silver_Bullet => Silver_Bullet, Guard_Succeed => Guard_Succeed); exit when Attacked; end if; end; end loop; -- 護衛記録だけ if Guard /= No_Person then Append ( Village.Messages, Message'( Kind => Hunter_Guard_No_Response, Day => Village.Today, Time => Now, Subject => The_Hunter, Target => Guard, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; -- 初日感染時間が過ぎたことを記録 Append ( Village.Messages, Message'( Kind => Foreboding, Day => Village.Today, Time => Now, Subject => No_Person, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end; Changed := True; end if; -- 一次開票 if Preliminary_Voting then Preliminary_Vote (Village, Now, Changed); end if; -- 昼から投票待ちへ if Daytime_To_Vote then Village.Time := Vote; end if; -- 投票待ちから夜へ if Vote_To_Night then Village.Time := Night; -- 日付を更新 Village.Dawn := Now; Increment_Today; -- 医者 (生存しているかぎり、感染すると治療はなし) declare The_Doctor : constant Person_Index'Base := Find_Superman(Village, Doctor); begin if The_Doctor >= 0 and then Village.People.Constant_Reference (The_Doctor).Records.Constant_Reference (Village.Today).State /= Died then declare Target : constant Person_Index'Base := Village.People.Constant_Reference (The_Doctor).Records.Constant_Reference (Village.Today - 1).Target; Kind : Message_Kind; begin if Target >= 0 and then Village.People.Constant_Reference (Target).Records.Constant_Reference (Village.Today).State /= Died then if Village.People.Constant_Reference(Target).Role = Gremlin then Gremlin_Kill_Doctor := True; Kind := Doctor_Found_Gremlin; elsif Village.People.Constant_Reference (Target).Records.Constant_Reference (Village.Today).State = Infected then if Village.Doctor_Infected = Find_Infection and then Village.People.Constant_Reference (The_Doctor).Records.Constant_Reference (Village.Today).State = Infected then Kind := Doctor_Found_Infection; else -- 治療成功 Village.People.Reference (Target).Records.Reference (Village.Today).State := Normal; Kind := Doctor_Cure; end if; else Kind := Doctor_Failed; end if; Append ( Village.Messages, (Kind => Kind, Day => Village.Today, Time => Now, Subject => The_Doctor, Target => Target, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; end; end if; end; -- 探偵 (生存しているかぎり) declare The_Detective : constant Person_Index'Base := Find_Superman (Village, Detective); begin if The_Detective >= 0 and then Village.People.Constant_Reference (The_Detective).Records.Constant_Reference (Village.Today).State /= Died then if Village.Today <= 2 then if Village.Execution = Dummy_Killed_And_From_First then Append ( Village.Messages, (Kind => Detective_Survey_Victim, Day => Village.Today, Time => Now, Subject => The_Detective, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; else declare Target : constant Person_Index'Base := Village.People.Constant_Reference (The_Detective).Records.Constant_Reference (Village.Today - 1).Target; begin if Target >= 0 and then Village.People.Constant_Reference (Target).Records.Constant_Reference (Village.Today - 1).State = Died then Append ( Village.Messages, (Kind => Detective_Survey, Day => Village.Today, Time => Now, Subject => The_Detective, Target => Target, Text => Village.People.Constant_Reference (Target).Records.Constant_Reference (Village.Today - 1).Note)); end if; end; end if; end if; end; -- 処刑 Executed := Get_Execution(Village.Today - 1); if Executed >= 0 then Village.People.Reference (Executed).Records.Reference (Village.Today).State := Died; Append ( Village.Messages, (Kind => Execution, Day => Village.Today, Time => Now, Subject => No_Person, Target => Executed, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; -- 吸血鬼の会話があらかじめセットされていたら転写 if not Night_To_Daytime then Night_Talk_All (Village, Village.Today - 1, Now); end if; end if; -- 夜から昼へ if Night_To_Daytime then Village.Time := Daytime; -- 誰が処刑されたかを拾っておく Executed := No_Person; Find_Executed : for I in reverse Message_Index'First .. Village.Messages.Last_Index loop declare Message : Villages.Message renames Village.Messages.Constant_Reference (I); begin if Message.Day = Village.Today and then Message.Kind = Execution then Executed := Message.Target; exit; elsif Message.Day < Village.Today then exit; end if; end; end loop Find_Executed; -- 自覚症状 (猟師と天文家のみ) for I in People_Index loop if Village.People.Constant_Reference (I).Records.Constant_Reference (Village.Today).State = Infected then case Village.People.Constant_Reference (I).Role is when Hunter | Astronomer => Append ( Village.Messages, (Kind => Awareness, Day => Village.Today, Time => Now, Subject => I, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); when others => null; end case; end if; end loop; -- 観測 (感染すると無効) declare The_Astronomer : constant Person_Index'Base := Find_Superman (Village, Astronomer); begin if The_Astronomer >= 0 and then Village.People.Constant_Reference (The_Astronomer).Records.Constant_Reference (Village.Today).State = Normal then declare Target : constant Person_Index'Base := Village.People.Constant_Reference (The_Astronomer).Records.Constant_Reference (Village.Today - 1).Target; begin if Target >= 0 and then Village.People.Constant_Reference (Target).Records.Constant_Reference (Village.Today).State /= Died then Append ( Village.Messages, (Kind => Astronomer_Observation, Day => Village.Today, Time => Now, Subject => The_Astronomer, Target => Target, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); if Village.People.Constant_Reference(Target).Role = Gremlin then Gremlin_Kill_Astronomer := True; end if; end if; end; end if; end; -- 吸血鬼の会話 (夜→昼の1発言は数奇な運命の村人に妨害されない) Vampire_Meeting : for Rank in Vampire_Role loop declare Vampire : constant Person_Index'Base := Find_Superman(Village, Rank); begin if Vampire >= 0 and then Village.People.Constant_Reference (Vampire).Records.Constant_Reference (Village.Today).State /= Died then if not Village.People.Constant_Reference (Vampire).Records.Constant_Reference (Village.Today - 1).Note.Is_Null then Append ( Village.Messages, (Kind => Meeting, Day => Village.Today, Time => Now, Subject => No_Person, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); exit Vampire_Meeting; end if; end if; end; end loop Vampire_Meeting; -- 襲撃 (感染すると天文家、猟師または医者も)、と、ガード (感染すると無効) declare The_Hunter : constant Person_Index'Base := Village.Find_Superman (Hunter); The_Astronomer : constant Person_Index'Base := Village.Find_Superman (Astronomer); Guard : Person_Index'Base := No_Person; Silver_Bullet : Boolean := False; Guard_Succeed : Boolean := False; Attacked : Boolean; Astronomer_State, Hunter_State : Person_State; -- 連鎖が起きないように状態を保存 Canceled : Person_Index'Base := No_Person; -- 襲撃取りやめアクションの対象 begin -- キャンセル先 Find_Cancel : for I in reverse Message_Index'First .. Village.Messages.Last_Index loop declare Message : Villages.Message renames Village.Messages.Constant_Reference (I); begin if Message.Kind = Action_Vampire_Cancel then Canceled := Message.Target; exit Find_Cancel; elsif Message.Day < Village.Today - 1 then exit Find_Cancel; end if; end; end loop Find_Cancel; -- 猟師の行動確認 if The_Hunter /= No_Person then Hunter_State := Village.People.Constant_Reference (The_Hunter).Records.Constant_Reference (Village.Today).State; if Hunter_State = Normal then Guard := Village.People.Constant_Reference (The_Hunter).Records.Constant_Reference (Village.Today - 1).Target; Silver_Bullet := Village.People.Constant_Reference (The_Hunter).Records.Constant_Reference (Village.Today - 1).Special; end if; end if; if The_Astronomer /= No_Person then Astronomer_State := Village.People.Constant_Reference (The_Astronomer).Records.Constant_Reference (Village.Today).State; end if; -- 吸血鬼の襲撃 for Rank in Vampire_Role loop declare The_Vampire : constant Person_Index'Base := Village.Find_Superman (Rank); begin if The_Vampire /= No_Person then Attack ( Executed => Executed, Canceled => No_Person, Infection_Only_In_First => False, The_Vampire => The_Vampire, Night_State => Infected, Attacked => Attacked, The_Hunter => The_Hunter, Guard => Guard, Silver_Bullet => Silver_Bullet, Guard_Succeed => Guard_Succeed); exit when Attacked; end if; end; end loop; case Village.Attack is when Nocturnal_Chain_Infecting => -- 天文家の襲撃 if The_Astronomer /= No_Person then Attack ( Executed => Executed, Canceled => Canceled, Infection_Only_In_First => False, The_Vampire => The_Astronomer, Night_State => Astronomer_State, Attacked => Attacked, The_Hunter => The_Hunter, Guard => Guard, Silver_Bullet => Silver_Bullet, Guard_Succeed => Guard_Succeed); end if; -- 猟師の襲撃 if The_Hunter /= No_Person then Attack ( Executed => Executed, Canceled => Canceled, Infection_Only_In_First => False, The_Vampire => The_Hunter, Night_State => Hunter_State, Attacked => Attacked, The_Hunter => The_Hunter, Guard => Guard, Silver_Bullet => Silver_Bullet, Guard_Succeed => Guard_Succeed); end if; when others => null; end case; -- 襲撃が来なかった時の猟師 if not Guard_Succeed then if Guard >= 0 then declare Hunter_Result : Message_Kind; begin if Silver_Bullet then Hunter_Result := Hunter_Failed_With_Silver; else Hunter_Result := Hunter_Failed; end if; Append ( Village.Messages, (Kind => Hunter_Result, Day => Village.Today, Time => Now, Subject => The_Hunter, Target => Guard, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end; elsif Silver_Bullet then Append ( Village.Messages, (Kind => Hunter_Nothing_With_Silver, Day => Village.Today, Time => Now, Subject => The_Hunter, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; end if; end; -- 妖魔 declare The_Gremlin : constant Person_Index'Base := Find_Superman(Village, Gremlin); begin if The_Gremlin >= 0 and then Village.People.Constant_Reference (The_Gremlin).Records.Constant_Reference (Village.Today).State /= Died then Append ( Village.Messages, (Kind => Gremlin_Sense, Day => Village.Today, Time => Now, Subject => The_Gremlin, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); end if; end; if Gremlin_Kill_Doctor then declare The_Doctor : constant Person_Index'Base := Find_Superman(Village, Doctor); begin pragma Assert(The_Doctor >= 0); Village.People.Reference (The_Doctor).Records.Reference (Village.Today).State := Died; end; end if; if Gremlin_Kill_Astronomer then declare The_Astronomer : constant Person_Index'Base := Find_Superman (Village, Astronomer); begin pragma Assert(The_Astronomer >= 0); Village.People.Reference (The_Astronomer).Records.Reference (Village.Today).State := Died; end; end if; -- 恋人 declare procedure Love_Process(Lover_Role, Loved_Role : in Person_Role) is Lover_Person : constant Person_Index'Base := Find_Superman (Village, Lover_Role); Loved_Person : constant Person_Index'Base := Find_Superman (Village, Loved_Role); begin if Lover_Person >= 0 and then Loved_Person >= 0 then if Village.People.Constant_Reference (Lover_Person).Records.Constant_Reference (Village.Today).State /= Died then case Village.People.Constant_Reference(Loved_Person).Records.Constant_Reference(Village.Today).State is when Died => Village.People.Reference (Lover_Person).Records.Reference (Village.Today).State := Died; Append ( Village.Messages, (Kind => Sweetheart_Suicide, Day => Village.Today, Time => Now, Subject => Lover_Person, Target => Loved_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); when Infected => Append ( Village.Messages, (Kind => Sweetheart_Incongruity, Day => Village.Today, Time => Now, Subject => Lover_Person, Target => Loved_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); when Normal => null; end case; end if; end if; end; begin Love_Process(Lover, Loved_Inhabitant); Love_Process(Sweetheart_M, Sweetheart_F); Love_Process(Sweetheart_F, Sweetheart_M); end; -- 生存者リスト Append ( Village.Messages, (Kind => List, Day => Village.Today, Time => Now, Subject => No_Person, Target => No_Person, Text => Ada.Strings.Unbounded.Null_Unbounded_String)); -- 生きていて前日発言が無い場合は強制コミット declare Said : Message_Counts renames Count_Messages(Village, Village.Today - 1); begin for Position in People_Index loop if Village.People.Constant_Reference (Position).Records .Constant_Reference (Village.Today).State /= Died and then Said (Position).Speech = 0 then Village.People.Reference(Position).Commited := True; end if; end loop; end; -- ラストの視線が襲撃デフォルト declare Target : Person_Index'Base := No_Person; begin Find_Gaze : for I in reverse Message_Index'First .. Village.Messages.Last_Index loop if Village.Messages.Constant_Reference (I).Kind = Action_Vampire_Gaze then Target := Village.Messages.Constant_Reference (I).Target; exit Find_Gaze; end if; end loop Find_Gaze; if Target >= 0 and then Village.People.Constant_Reference (Target).Records.Constant_Reference (Village.Today).State /= Died then for Position in People_Index loop if Village.People.Constant_Reference (Position).Records.Constant_Reference (Village.Today).State /= Died and then Village.People.Constant_Reference (Position).Role in Vampire_Role then Village.People.Reference(Position).Records.Reference (Village.Today).Target := Target; end if; end loop; end if; end; -- 終了条件チェック if Finished then Village.State := Epilogue; -- 全員コミット解除 for I in People_Index loop Village.People.Reference(I).Commited := False; end loop; end if; end if; end; when Epilogue => Changed := Now - Village.Dawn >= Duration'Max ( Village.Day_Duration, Epilogue_Min_Duration); -- エピローグは最低でも1時間 List_Changed := Changed; if Changed then Village.Dawn := Now; Village.State := Closed; end if; when Closed => Changed := False; List_Changed := False; end case; end Vampire.Villages.Advance;
reznikmm/matreshka
Ada
3,774
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Attributes; package ODF.DOM.Style_Diagonal_Tl_Br_Widths_Attributes is pragma Preelaborate; type ODF_Style_Diagonal_Tl_Br_Widths_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Style_Diagonal_Tl_Br_Widths_Attribute_Access is access all ODF_Style_Diagonal_Tl_Br_Widths_Attribute'Class with Storage_Size => 0; end ODF.DOM.Style_Diagonal_Tl_Br_Widths_Attributes;
reznikmm/matreshka
Ada
4,711
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Draw.Caption_Fit_Line_Length_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Draw_Caption_Fit_Line_Length_Attribute_Node is begin return Self : Draw_Caption_Fit_Line_Length_Attribute_Node do Matreshka.ODF_Draw.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Draw_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Draw_Caption_Fit_Line_Length_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Caption_Fit_Line_Length_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Draw_URI, Matreshka.ODF_String_Constants.Caption_Fit_Line_Length_Attribute, Draw_Caption_Fit_Line_Length_Attribute_Node'Tag); end Matreshka.ODF_Draw.Caption_Fit_Line_Length_Attributes;
CCSI-Toolset/FOQUS
Ada
777
ads
<AdbFile> <GuidDictionary count="8"> <Guid value="fb058446-e81c-4e84-a1c6-57d0a3202bbe" int="0"/> <Guid value="41340af0-5649-4a04-ac15-f9ecf80780dc" int="1"/> <Guid value="8cbeae04-3fe5-48d6-91ce-47f8db9f460d" int="2"/> <Guid value="149049bb-db00-453c-9f0a-ce5f829dfa6a" int="3"/> <Guid value="e46b55ab-2cdf-4ff3-8a9d-f32c385b7477" int="4"/> <Guid value="d9f77d68-a1a6-41e6-bb0a-4aac78acaeb3" int="5"/> <Guid value="96c0ded1-6432-40aa-9658-1a8f04b73e5a" int="6"/> <Guid value="0c1b0347-8cdf-4384-9334-b8d0afed0470" int="7"/> </GuidDictionary> <Records> <Record typeGuid="0" guid="1"><Value guid="3">2</Value><Value guid="4">0</Value><Value guid="5">0</Value><Value guid="6">0</Value></Record> <Record typeGuid="7" guid="2"></Record> </Records></AdbFile>
AdaCore/Ada_Drivers_Library
Ada
31,115
adb
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2015, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of STMicroelectronics nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- -- -- -- This file is based on: -- -- -- -- @file l3gd20.c -- -- @author MCD Application Team -- -- @version V1.1.0 -- -- @date 19-June-2014 -- -- @brief This file provides a set of functions needed to manage the -- -- L3GD20, ST MEMS motion sensor, 3-axis digital output -- -- gyroscope. -- -- -- -- COPYRIGHT(c) 2014 STMicroelectronics -- ------------------------------------------------------------------------------ with Ada.Unchecked_Conversion; with System; package body L3GD20 is -- the following are per Table 4 of the L3GD20 Datasheet, pg 9. -- the values are millidegrees per second, so we scale accordingly Sensitivity_250dps : constant := 8.75 * 0.001; -- mdps/digit Sensitivity_500dps : constant := 17.5 * 0.001; -- mdps/digit Sensitivity_2000dps : constant := 70.0 * 0.001; -- mdps/digit ReadWrite_CMD : constant := 16#80#; MultiUInt8_CMD : constant := 16#40#; -- bit definitions for the CTRL_REG3 register INT1_Interrupt_Enable : constant := 2#1000_0000#; Interrupt_Pin_Mode_Bit : constant := 2#0001_0000#; INT2_Data_Ready_Interrupt_Enable : constant := 2#0000_1000#; INT2_Watermark_Interrupt_Enable : constant := 2#0000_0100#; INT2_Overrun_Interrupt_Enable : constant := 2#0000_0010#; INT2_FIFO_Empty_Interrupt_Enable : constant := 2#0000_0001#; -- bit definitions for the CTRL_REG4 register Endian_Selection_Mask : constant := 2#0100_0000#; Fullscale_Selection_Bits : constant := 2#0011_0000#; -- bit definitions for the CTRL_REG5 register Boot_Bit : constant := 2#1000_0000#; FIFO_Enable_Bit : constant := 2#0100_0000#; HighPass_Filter_Enable : constant := 2#0001_0000#; LowPass_Filter_Enable : constant := 2#0000_0010#; -- bit definitions for the FIFO_CTRL register FIFO_Mode_Bits : constant := 2#1110_0000#; Watermark_Threshold_Bits : constant := 2#0001_1111#; -- bit definitions for the FIFO_SRC register Watermark_Status_Bit : constant := 2#1000_0000#; FIFO_Overrun_Bit : constant := 2#0100_0000#; FIFO_Empty_Bit : constant := 2#0010_0000#; FIFO_Depth_Bits : constant := 2#0001_1111#; -- bit definitions for the INT1_CFG register Logically_And_Or_Events_Bit : constant := 2#1000_0000#; Int1_Latch_Enable_Bit : constant := 2#0100_0000#; Axes_Interrupt_Enablers : constant array (Axes_Interrupts) of UInt8 := (Z_High_Interrupt => 2#0010_0000#, Z_Low_Interrupt => 2#0001_0000#, Y_High_Interrupt => 2#0000_1000#, Y_Low_Interrupt => 2#0000_0100#, X_High_Interrupt => 2#0000_0010#, X_Low_Interrupt => 2#0000_0001#); function As_UInt8 is new Ada.Unchecked_Conversion (Source => High_Pass_Filter_Mode, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => High_Pass_Cutoff_Frequency, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => Power_Mode_Selection, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => Output_Data_Rate_Selection, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => Axes_Selection, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => Bandwidth_Selection, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => Block_Data_Update_Selection, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => Endian_Data_Selection, Target => UInt8); function As_UInt8 is new Ada.Unchecked_Conversion (Source => Full_Scale_Selection, Target => UInt8); type Angle_Rate_Pointer is access all Angle_Rate with Storage_Size => 0; function As_Angle_Rate_Pointer is new Ada.Unchecked_Conversion (Source => System.Address, Target => Angle_Rate_Pointer); -- So that we can treat the address of a UInt8 as a pointer to a two-UInt8 -- sequence representing a signed integer quantity. procedure Swap2 (Location : System.Address) with Inline; -- Swaps the two UInt8s at Location and Location+1 procedure SPI_Mode (This : Three_Axis_Gyroscope; Enabled : Boolean); -- Enable or disable SPI mode communication with the device. This is named -- "chip select" in other demos/examples. ---------------- -- Initialize -- ---------------- procedure Initialize (This : in out Three_Axis_Gyroscope; Port : Any_SPI_Port; Chip_Select : Any_GPIO_Point) is begin This.Port := Port; This.CS := Chip_Select; SPI_Mode (This, Enabled => False); end Initialize; ----------------- -- SPI_Mode -- ----------------- procedure SPI_Mode (This : Three_Axis_Gyroscope; Enabled : Boolean) is -- When the pin is low (cleared), the device is in SPI mode. -- When the pin is high (set), the device is in I2C mode. -- We want SPI mode communication, so Enabled, when True, -- means we must drive the pin low. begin if Enabled then This.CS.Clear; else This.CS.Set; end if; end SPI_Mode; ----------- -- Write -- ----------- procedure Write (This : Three_Axis_Gyroscope; Addr : Register; Data : UInt8) is Status : SPI_Status; begin SPI_Mode (This, Enabled => True); This.Port.Transmit (SPI_Data_8b'(1 => UInt8 (Addr)), Status); if Status /= Ok then raise Program_Error; end if; This.Port.Transmit (SPI_Data_8b'(1 => Data), Status); if Status /= Ok then raise Program_Error; end if; SPI_Mode (This, Enabled => False); end Write; ---------- -- Read -- ---------- procedure Read (This : Three_Axis_Gyroscope; Addr : Register; Data : out UInt8) is Status : SPI_Status; Tmp_Data : SPI_Data_8b (1 .. 1); begin SPI_Mode (This, Enabled => True); This.Port.Transmit (SPI_Data_8b'(1 => UInt8 (Addr) or ReadWrite_CMD), Status); if Status /= Ok then raise Program_Error; end if; This.Port.Receive (Tmp_Data, Status); if Status /= Ok then raise Program_Error; end if; Data := Tmp_Data (Tmp_Data'First); SPI_Mode (This, Enabled => False); end Read; ---------------- -- Read_UInt8s -- ---------------- procedure Read_UInt8s (This : Three_Axis_Gyroscope; Addr : Register; Buffer : out SPI_Data_8b; Count : Natural) is Index : Natural := Buffer'First; Status : SPI_Status; Tmp_Data : SPI_Data_8b (1 .. 1); begin SPI_Mode (This, Enabled => True); This.Port.Transmit (SPI_Data_8b'(1 => UInt8 (Addr) or ReadWrite_CMD or MultiUInt8_CMD), Status); if Status /= Ok then raise Program_Error; end if; for K in 1 .. Count loop This.Port.Receive (Tmp_Data, Status); if Status /= Ok then raise Program_Error; end if; Buffer (Index) := Tmp_Data (Tmp_Data'First); Index := Index + 1; end loop; SPI_Mode (This, Enabled => False); end Read_UInt8s; --------------- -- Configure -- --------------- procedure Configure (This : in out Three_Axis_Gyroscope; Power_Mode : Power_Mode_Selection; Output_Data_Rate : Output_Data_Rate_Selection; Axes_Enable : Axes_Selection; Bandwidth : Bandwidth_Selection; BlockData_Update : Block_Data_Update_Selection; Endianness : Endian_Data_Selection; Full_Scale : Full_Scale_Selection) is Ctrl1 : UInt8; Ctrl4 : UInt8; begin Ctrl1 := As_UInt8 (Power_Mode) or As_UInt8 (Output_Data_Rate) or As_UInt8 (Axes_Enable) or As_UInt8 (Bandwidth); Ctrl4 := As_UInt8 (BlockData_Update) or As_UInt8 (Endianness) or As_UInt8 (Full_Scale); Write (This, CTRL_REG1, Ctrl1); Write (This, CTRL_REG4, Ctrl4); end Configure; ----------- -- Sleep -- ----------- procedure Sleep (This : in out Three_Axis_Gyroscope) is Ctrl1 : UInt8; Sleep_Mode : constant := 2#1000#; -- per the Datasheet, Table 22, pg 32 begin Read (This, CTRL_REG1, Ctrl1); Ctrl1 := Ctrl1 or Sleep_Mode; Write (This, CTRL_REG1, Ctrl1); end Sleep; -------------------------------- -- Configure_High_Pass_Filter -- -------------------------------- procedure Configure_High_Pass_Filter (This : in out Three_Axis_Gyroscope; Mode_Selection : High_Pass_Filter_Mode; Cutoff_Frequency : High_Pass_Cutoff_Frequency) is Ctrl2 : UInt8; begin -- note that the two high-order bits must remain zero, per the datasheet Ctrl2 := As_UInt8 (Mode_Selection) or As_UInt8 (Cutoff_Frequency); Write (This, CTRL_REG2, Ctrl2); end Configure_High_Pass_Filter; ----------------------------- -- Enable_High_Pass_Filter -- ----------------------------- procedure Enable_High_Pass_Filter (This : in out Three_Axis_Gyroscope) is Ctrl5 : UInt8; begin Read (This, CTRL_REG5, Ctrl5); -- set HPen bit Ctrl5 := Ctrl5 or HighPass_Filter_Enable; Write (This, CTRL_REG5, Ctrl5); end Enable_High_Pass_Filter; ------------------------------ -- Disable_High_Pass_Filter -- ------------------------------ procedure Disable_High_Pass_Filter (This : in out Three_Axis_Gyroscope) is Ctrl5 : UInt8; begin Read (This, CTRL_REG5, Ctrl5); -- clear HPen bit Ctrl5 := Ctrl5 and (not HighPass_Filter_Enable); Write (This, CTRL_REG5, Ctrl5); end Disable_High_Pass_Filter; ---------------------------- -- Enable_Low_Pass_Filter -- ---------------------------- procedure Enable_Low_Pass_Filter (This : in out Three_Axis_Gyroscope) is Ctrl5 : UInt8; begin Read (This, CTRL_REG5, Ctrl5); Ctrl5 := Ctrl5 or LowPass_Filter_Enable; Write (This, CTRL_REG5, Ctrl5); end Enable_Low_Pass_Filter; ----------------------------- -- Disable_Low_Pass_Filter -- ----------------------------- procedure Disable_Low_Pass_Filter (This : in out Three_Axis_Gyroscope) is Ctrl5 : UInt8; begin Read (This, CTRL_REG5, Ctrl5); -- clear HPen bit Ctrl5 := Ctrl5 and (not LowPass_Filter_Enable); Write (This, CTRL_REG5, Ctrl5); end Disable_Low_Pass_Filter; --------------------- -- Reference_Value -- --------------------- function Reference_Value (This : Three_Axis_Gyroscope) return UInt8 is Result : UInt8; begin Read (This, Reference, Result); return Result; end Reference_Value; ------------------- -- Set_Reference -- ------------------- procedure Set_Reference (This : in out Three_Axis_Gyroscope; Value : UInt8) is begin Write (This, Reference, Value); end Set_Reference; ----------------- -- Data_Status -- ----------------- function Data_Status (This : Three_Axis_Gyroscope) return Gyro_Data_Status is Result : UInt8; function As_Gyro_Data_Status is new Ada.Unchecked_Conversion (Source => UInt8, Target => Gyro_Data_Status); begin Read (This, Status, Result); return As_Gyro_Data_Status (Result); end Data_Status; --------------- -- Device_Id -- --------------- function Device_Id (This : Three_Axis_Gyroscope) return UInt8 is Result : UInt8; begin Read (This, Who_Am_I, Result); return Result; end Device_Id; ----------------- -- Temperature -- ----------------- function Temperature (This : Three_Axis_Gyroscope) return UInt8 is Result : UInt8; begin Read (This, OUT_Temp, Result); return Result; end Temperature; ------------ -- Reboot -- ------------ procedure Reboot (This : Three_Axis_Gyroscope) is Ctrl5 : UInt8; begin Read (This, CTRL_REG5, Ctrl5); -- set the boot bit Ctrl5 := Ctrl5 or Boot_Bit; Write (This, CTRL_REG5, Ctrl5); end Reboot; ---------------------------- -- Full_Scale_Sensitivity -- ---------------------------- function Full_Scale_Sensitivity (This : Three_Axis_Gyroscope) return Float is Ctrl4 : UInt8; Result : Float; Fullscale_Selection : UInt8; begin Read (This, CTRL_REG4, Ctrl4); Fullscale_Selection := Ctrl4 and Fullscale_Selection_Bits; if Fullscale_Selection = L3GD20_Fullscale_250'Enum_Rep then Result := Sensitivity_250dps; elsif Fullscale_Selection = L3GD20_Fullscale_500'Enum_Rep then Result := Sensitivity_500dps; else Result := Sensitivity_2000dps; end if; return Result; end Full_Scale_Sensitivity; ------------------------- -- Get_Raw_Angle_Rates -- ------------------------- procedure Get_Raw_Angle_Rates (This : Three_Axis_Gyroscope; Rates : out Angle_Rates) is Ctrl4 : UInt8; UInt8s_To_Read : constant Integer := 6; -- ie, three 2-UInt8 integers -- the number of UInt8s in an Angle_Rates record object Received : SPI_Data_8b (1 .. UInt8s_To_Read); begin Read (This, CTRL_REG4, Ctrl4); Read_UInt8s (This, OUT_X_L, Received, UInt8s_To_Read); -- The above has the effect of separate reads, as follows: -- Read (This, OUT_X_L, Received (1)); -- Read (This, OUT_X_H, Received (2)); -- Read (This, OUT_Y_L, Received (3)); -- Read (This, OUT_Y_H, Received (4)); -- Read (This, OUT_Z_L, Received (5)); -- Read (This, OUT_Z_H, Received (6)); if (Ctrl4 and Endian_Selection_Mask) = L3GD20_Big_Endian'Enum_Rep then Swap2 (Received (1)'Address); Swap2 (Received (3)'Address); Swap2 (Received (5)'Address); end if; Rates.X := As_Angle_Rate_Pointer (Received (1)'Address).all; Rates.Y := As_Angle_Rate_Pointer (Received (3)'Address).all; Rates.Z := As_Angle_Rate_Pointer (Received (5)'Address).all; end Get_Raw_Angle_Rates; -------------------------- -- Configure_Interrupt1 -- -------------------------- procedure Configure_Interrupt1 (This : in out Three_Axis_Gyroscope; Triggers : Threshold_Event_List; Latched : Boolean := False; Active_Edge : Interrupt1_Active_Edge := L3GD20_Interrupt1_High_Edge; Combine_Events : Boolean := False; Sample_Count : Sample_Counter := 0) is Config : UInt8; Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and 16#DF#; Ctrl3 := Ctrl3 or Active_Edge'Enum_Rep; Ctrl3 := Ctrl3 or INT1_Interrupt_Enable; Write (This, CTRL_REG3, Ctrl3); if Sample_Count > 0 then Set_Duration_Counter (This, Sample_Count); end if; Config := 0; if Latched then Config := Config or Int1_Latch_Enable_Bit; end if; if Combine_Events then Config := Config or Logically_And_Or_Events_Bit; end if; for Event of Triggers loop Config := Config or Axes_Interrupt_Enablers (Event.Axis); end loop; Write (This, INT1_CFG, Config); for Event of Triggers loop Set_Threshold (This, Event.Axis, Event.Threshold); end loop; end Configure_Interrupt1; ---------------------------- -- Set_Interrupt_Pin_Mode -- ---------------------------- procedure Set_Interrupt_Pin_Mode (This : in out Three_Axis_Gyroscope; Mode : Pin_Modes) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and (not Interrupt_Pin_Mode_Bit); Ctrl3 := Ctrl3 or Mode'Enum_Rep; Write (This, CTRL_REG3, Ctrl3); end Set_Interrupt_Pin_Mode; ----------------------- -- Enable_Interrupt1 -- ----------------------- procedure Enable_Interrupt1 (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 or INT1_Interrupt_Enable; Write (This, CTRL_REG3, Ctrl3); end Enable_Interrupt1; ------------------------ -- Disable_Interrupt1 -- ------------------------ procedure Disable_Interrupt1 (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and (not INT1_Interrupt_Enable); Write (This, CTRL_REG3, Ctrl3); end Disable_Interrupt1; ----------------------- -- Interrupt1_Status -- ----------------------- function Interrupt1_Source (This : Three_Axis_Gyroscope) return Interrupt1_Sources is Result : UInt8; function As_Interrupt_Source is new Ada.Unchecked_Conversion (Source => UInt8, Target => Interrupt1_Sources); begin Read (This, INT1_SRC, Result); return As_Interrupt_Source (Result); end Interrupt1_Source; -------------------------- -- Set_Duration_Counter -- -------------------------- procedure Set_Duration_Counter (This : in out Three_Axis_Gyroscope; Value : Sample_Counter) is Wait_Bit : constant := 2#1000_0000#; begin Write (This, INT1_Duration, UInt8 (Value) or Wait_Bit); end Set_Duration_Counter; ------------------ -- Enable_Event -- ------------------ procedure Enable_Event (This : in out Three_Axis_Gyroscope; Event : Axes_Interrupts) is Config : UInt8; begin Read (This, INT1_CFG, Config); Config := Config or Axes_Interrupt_Enablers (Event); Write (This, INT1_CFG, Config); end Enable_Event; ------------------- -- Disable_Event -- ------------------- procedure Disable_Event (This : in out Three_Axis_Gyroscope; Event : Axes_Interrupts) is Config : UInt8; begin Read (This, INT1_CFG, Config); Config := Config and (not Axes_Interrupt_Enablers (Event)); Write (This, INT1_CFG, Config); end Disable_Event; ------------------- -- Set_Threshold -- ------------------- procedure Set_Threshold (This : in out Three_Axis_Gyroscope; Event : Axes_Interrupts; Value : Axis_Sample_Threshold) is begin case Event is when Z_High_Interrupt | Z_Low_Interrupt => Write (This, INT1_TSH_ZL, UInt8 (Value)); Write (This, INT1_TSH_ZH, UInt8 (Shift_Right (Value, 8))); when Y_High_Interrupt | Y_Low_Interrupt => Write (This, INT1_TSH_YL, UInt8 (Value)); Write (This, INT1_TSH_YH, UInt8 (Shift_Right (Value, 8))); when X_High_Interrupt | X_Low_Interrupt => Write (This, INT1_TSH_XL, UInt8 (Value)); Write (This, INT1_TSH_XH, UInt8 (Shift_Right (Value, 8))); end case; end Set_Threshold; ------------------- -- Set_FIFO_Mode -- ------------------- procedure Set_FIFO_Mode (This : in out Three_Axis_Gyroscope; Mode : FIFO_Modes) is FIFO : UInt8; begin Read (This, FIFO_CTRL, FIFO); FIFO := FIFO and (not FIFO_Mode_Bits); -- clear the current bits FIFO := FIFO or Mode'Enum_Rep; Write (This, FIFO_CTRL, FIFO); end Set_FIFO_Mode; ----------------- -- Enable_FIFO -- ----------------- procedure Enable_FIFO (This : in out Three_Axis_Gyroscope) is Ctrl5 : UInt8; begin Read (This, CTRL_REG5, Ctrl5); Ctrl5 := Ctrl5 or FIFO_Enable_Bit; Write (This, CTRL_REG5, Ctrl5); end Enable_FIFO; ------------------ -- Disable_FIFO -- ------------------ procedure Disable_FIFO (This : in out Three_Axis_Gyroscope) is Ctrl5 : UInt8; begin Read (This, CTRL_REG5, Ctrl5); Ctrl5 := Ctrl5 and (not FIFO_Enable_Bit); Write (This, CTRL_REG5, Ctrl5); end Disable_FIFO; ------------------------ -- Set_FIFO_Watermark -- ------------------------ procedure Set_FIFO_Watermark (This : in out Three_Axis_Gyroscope; Level : FIFO_Level) is Value : UInt8; begin Read (This, FIFO_CTRL, Value); Value := Value and (not Watermark_Threshold_Bits); -- clear the bits Value := Value or UInt8 (Level); Write (This, FIFO_CTRL, Value); end Set_FIFO_Watermark; ------------------------------ -- Get_Raw_Angle_Rates_FIFO -- ------------------------------ procedure Get_Raw_Angle_Rates_FIFO (This : in out Three_Axis_Gyroscope; Buffer : out Angle_Rates_FIFO_Buffer) is Ctrl4 : UInt8; Angle_Rate_Size : constant Integer := 6; -- UInt8s UInt8s_To_Read : constant Integer := Buffer'Length * Angle_Rate_Size; Received : SPI_Data_8b (0 .. UInt8s_To_Read - 1) with Alignment => 2; begin Read (This, CTRL_REG4, Ctrl4); Read_UInt8s (This, OUT_X_L, Received, UInt8s_To_Read); if (Ctrl4 and Endian_Selection_Mask) = L3GD20_Big_Endian'Enum_Rep then declare J : Integer := 0; begin for K in Received'First .. Received'Last / 2 loop Swap2 (Received (J)'Address); J := J + 2; end loop; end; end if; declare J : Integer := 0; begin for K in Buffer'Range loop Buffer (K).X := As_Angle_Rate_Pointer (Received (J)'Address).all; J := J + 2; Buffer (K).Y := As_Angle_Rate_Pointer (Received (J)'Address).all; J := J + 2; Buffer (K).Z := As_Angle_Rate_Pointer (Received (J)'Address).all; J := J + 2; end loop; end; end Get_Raw_Angle_Rates_FIFO; ------------------------ -- Current_FIFO_Depth -- ------------------------ function Current_FIFO_Depth (This : Three_Axis_Gyroscope) return FIFO_Level is Result : UInt8; begin Read (This, FIFO_SRC, Result); Result := Result and FIFO_Depth_Bits; return FIFO_Level (Result); end Current_FIFO_Depth; -------------------------- -- FIFO_Below_Watermark -- -------------------------- function FIFO_Below_Watermark (This : Three_Axis_Gyroscope) return Boolean is Result : UInt8; begin Read (This, FIFO_SRC, Result); Result := Result and Watermark_Status_Bit; return Result = 0; end FIFO_Below_Watermark; ---------------- -- FIFO_Empty -- ---------------- function FIFO_Empty (This : Three_Axis_Gyroscope) return Boolean is Result : UInt8; begin Read (This, FIFO_SRC, Result); Result := Result and FIFO_Empty_Bit; return Result = FIFO_Empty_Bit; end FIFO_Empty; ------------------ -- FIFO_Overrun -- ------------------ function FIFO_Overrun (This : Three_Axis_Gyroscope) return Boolean is Result : UInt8; begin Read (This, FIFO_SRC, Result); Result := Result and FIFO_Overrun_Bit; return Result = FIFO_Overrun_Bit; end FIFO_Overrun; --------------------------------- -- Enable_Data_Ready_Interrupt -- --------------------------------- procedure Enable_Data_Ready_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 or INT2_Data_Ready_Interrupt_Enable; Write (This, CTRL_REG3, Ctrl3); end Enable_Data_Ready_Interrupt; ---------------------------------- -- Disable_Data_Ready_Interrupt -- ---------------------------------- procedure Disable_Data_Ready_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and (not INT2_Data_Ready_Interrupt_Enable); Write (This, CTRL_REG3, Ctrl3); end Disable_Data_Ready_Interrupt; ------------------------------------- -- Enable_FIFO_Watermark_Interrupt -- ------------------------------------- procedure Enable_FIFO_Watermark_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 or INT2_Watermark_Interrupt_Enable; Write (This, CTRL_REG3, Ctrl3); end Enable_FIFO_Watermark_Interrupt; ----------------------------- -- Disable_Int1_Interrupts -- ----------------------------- procedure Disable_Int1_Interrupts (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and 2#0001_1111#; Write (This, CTRL_REG3, Ctrl3); end Disable_Int1_Interrupts; ----------------------------- -- Disable_Int2_Interrupts -- ----------------------------- procedure Disable_Int2_Interrupts (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and 2#1111_0000#; Write (This, CTRL_REG3, Ctrl3); end Disable_Int2_Interrupts; -------------------------------------- -- Disable_FIFO_Watermark_Interrupt -- -------------------------------------- procedure Disable_FIFO_Watermark_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and (not INT2_Watermark_Interrupt_Enable); Write (This, CTRL_REG3, Ctrl3); end Disable_FIFO_Watermark_Interrupt; ----------------------------------- -- Enable_FIFO_Overrun_Interrupt -- ----------------------------------- procedure Enable_FIFO_Overrun_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 or INT2_Overrun_Interrupt_Enable; Write (This, CTRL_REG3, Ctrl3); end Enable_FIFO_Overrun_Interrupt; ------------------------------------ -- Disable_FIFO_Overrun_Interrupt -- ------------------------------------ procedure Disable_FIFO_Overrun_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and (not INT2_Overrun_Interrupt_Enable); Write (This, CTRL_REG3, Ctrl3); end Disable_FIFO_Overrun_Interrupt; --------------------------------- -- Enable_FIFO_Empty_Interrupt -- --------------------------------- procedure Enable_FIFO_Empty_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 or INT2_FIFO_Empty_Interrupt_Enable; Write (This, CTRL_REG3, Ctrl3); end Enable_FIFO_Empty_Interrupt; ---------------------------------- -- Disable_FIFO_Empty_Interrupt -- ---------------------------------- procedure Disable_FIFO_Empty_Interrupt (This : in out Three_Axis_Gyroscope) is Ctrl3 : UInt8; begin Read (This, CTRL_REG3, Ctrl3); Ctrl3 := Ctrl3 and (not INT2_FIFO_Empty_Interrupt_Enable); Write (This, CTRL_REG3, Ctrl3); end Disable_FIFO_Empty_Interrupt; ----------- -- Swap2 -- ----------- procedure Swap2 (Location : System.Address) is X : UInt16; for X'Address use Location; function Bswap_16 (X : UInt16) return UInt16; pragma Import (Intrinsic, Bswap_16, "__builtin_bswap16"); begin X := Bswap_16 (X); end Swap2; ----------- -- Reset -- ----------- procedure Reset (This : in out Three_Axis_Gyroscope) is begin -- per the Datasheet, Table 17, pg 29 Write (This, CTRL_REG1, 2#0000_0111#); Write (This, CTRL_REG2, 0); Write (This, CTRL_REG3, 0); Write (This, CTRL_REG4, 0); Write (This, CTRL_REG5, 0); Write (This, Reference, 0); Write (This, FIFO_CTRL, 0); Write (This, INT1_CFG, 0); Write (This, INT1_TSH_ZL, 0); Write (This, INT1_TSH_ZH, 0); Write (This, INT1_TSH_YL, 0); Write (This, INT1_TSH_YH, 0); Write (This, INT1_TSH_XL, 0); Write (This, INT1_TSH_XH, 0); Write (This, INT1_Duration, 0); end Reset; end L3GD20;
AdaCore/gpr
Ada
1,389
ads
------------------------------------------------------------------------------ -- -- -- GPR2 PROJECT MANAGER -- -- -- -- Copyright (C) 2022-2023, AdaCore -- -- -- -- This is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. This software is distributed in the hope that it will be useful, -- -- but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHAN- -- -- TABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public -- -- License for more details. You should have received a copy of the GNU -- -- General Public License distributed with GNAT; see file COPYING. If not, -- -- see <http://www.gnu.org/licenses/>. -- -- -- ------------------------------------------------------------------------------ package GPRbuild with Pure is end GPRbuild;
sebsgit/textproc
Ada
5,037
adb
with MathUtils; package body Tensor is function Element_Count(d: in Var'Class) return Positive is begin return Positive(d.data.Length); end Element_Count; function Allocate(value_count: in Positive) return Var is begin return r: Var do r.size.Append(value_count); r.data.Set_Length(Ada.Containers.Count_Type(value_count)); end return; end Allocate; function Variable(values: in Float_Array) return Var is result: Var; idx_out: Natural := 1; begin result.size.Set_Length(1); result.data.Set_Length(values'Length); result.size(1) := values'Length; for idx_in in values'First .. values'Last loop result.data(idx_out) := values(idx_in); idx_out := idx_out + 1; end loop; return result; end Variable; function Matrix(row_length: in Positive; values: in Float_Array) return Var is result: Var; idx_out: Natural := 1; begin result.size.Set_Length(2); result.data.Set_Length(values'Length); result.size(1) := values'Length / row_length; result.size(2) := row_length; for idx_in in values'First .. values'Last loop result.data(idx_out) := values(idx_in); idx_out := idx_out + 1; end loop; return result; end Matrix; function Dimension_Count(v: in Var'Class) return Positive is begin return Positive(v.size.Length); end Dimension_Count; function Dimension(v: in Var'Class; n_dim: in Positive) return Positive is begin return v.size(n_dim); end Dimension; function Data(v: in Var) return MathUtils.Vector is begin return v.data; end Data; function Element(v: in Var; idx_0, idx_1: in Positive) return Float is begin if idx_0 = 1 then return v.data(idx_1); else return v.data( (idx_0 - 1) * v.size(2) + idx_1 ); end if; end Element; procedure Set(v: out Var; values: in Float_Array) is idx_out: Natural := 1; begin v.data.Set_Length(values'Length); for idx_in in values'First .. values'Last loop v.data(idx_out) := values(idx_in); idx_out := idx_out + 1; end loop; end Set; procedure Set(v: out Var; idx: Positive; value: in Float) is begin v.data(idx) := value; end Set; function Flatten(v: in Var'Class) return Var is result: Var; begin result.data := v.data; result.size.Append(Element_Count(v)); return result; end Flatten; procedure Flatten(v: in out Var'Class) is begin v.size.Clear; v.size.Append(Positive(v.data.Length)); end Flatten; procedure Reshape(v: in out Var'Class; s0, s1: Positive) is begin v.size.Clear; v.size.Append(s0); v.size.Append(s1); end Reshape; procedure Random(v: in out Var'Class) is begin for i in v.data.First_Index .. v.data.Last_Index loop v.data.Replace_Element(i, MathUtils.rand01); end loop; end Random; function Dot_Elem_Count(v0, v1: in Var'Class) return Positive is begin if v0.Dimension_Count = 1 and v1.Dimension_Count = 1 then return 1; else return v0.Dimension(1); end if; end Dot_Elem_Count; function Dot(v0, v1: in Var'Class) return Var is result: Var; begin result.size.Append(Dot_Elem_Count(v0, v1)); result.data.Set_Length(Ada.Containers.Count_Type(Dot_Elem_Count(v0, v1))); for r in 1 .. result.size.Element(1) loop declare row_result: Float := 0.0; begin for k in 1 .. v1.Dimension(1) loop row_result := row_result + v1.Data(k) * v0.Element(r, k); end loop; result.data.Replace_Element(r, row_result); end; end loop; return result; end Dot; function "+" (v0, v1: in Var'Class) return Var is result: Var; begin result.size := v0.size; result.data := v0.data; declare idx_0: Positive := result.data.First_Index; begin for val of v1.data loop result.data.Replace_Element(idx_0, result.data.Element(idx_0) + val); idx_0 := idx_0 + 1; end loop; end; return result; end "+"; function "-" (v0, v1: in Var'Class) return Var is result: Var; begin result.size := v0.size; result.data := v0.data; declare idx_0: Positive := result.data.First_Index; begin for val of v1.data loop result.data.Replace_Element(idx_0, result.data.Element(idx_0) - val); idx_0 := idx_0 + 1; end loop; end; return result; end "-"; procedure Apply(v: in out Var; fn: Lambda_Func) is begin for idx in v.data.First_Index .. v.data.Last_Index loop declare new_val: constant Float := fn(v.data(idx)); begin v.data.Replace_Element(idx, new_val); end; end loop; end Apply; end Tensor;
MinimSecure/unum-sdk
Ada
1,115
adb
-- Copyright 2007-2016 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. procedure Foo is begin begin raise Constraint_Error; -- SPOT1 exception when others => null; end; begin raise Program_Error; -- SPOT2 exception when others => null; end; begin pragma Assert (False); -- SPOT3 null; exception when others => null; end; raise Constraint_Error; -- SPOT4 end Foo;
charlesdaniels/libagar
Ada
3,952
adb
-------------------------------------------------- -- Example of a custom Agar widget class: -- -- -- -- AG_Object(3) -> AG_Widget(3) -> CustomWidget -- -------------------------------------------------- with Ada.Text_IO; with System.Address_To_Access_Conversions; package body CustomWidget is package C_obj is new System.Address_To_Access_Conversions (CustomWidget_t); package T_IO renames Ada.Text_IO; use type C.int; -- -- Register the CustomWidget class with the Agar object system. We give -- the size of our Object instance and the size of our Class structure -- (or Widget_Class_t'Size if the Class structure is not being overloaded, -- as is the case in this example). -- -- The Version (Major, Minor) fields, and the Load and Save functions -- can be omitted since our example widget is not serializable. -- function Create_Class return Widget_Class_not_null_Access_t is begin Widget_Class := Create_Widget_Class (Hierarchy => "Agar(Widget):CustomWidget", Object_Size => CustomWidget.CustomWidget_t'Size, Class_Size => Widget_Class_t'Size, Init_Func => CustomWidget.Init'Access, Destroy_Func => CustomWidget.Destroy'Access, Size_Req_Func => CustomWidget.Size_Req'Access, Size_Alloc_Func => CustomWidget.Size_Alloc'Access, Draw_Func => CustomWidget.Draw'Access); return Widget_Class; end; -- -- Delete the CustomWidget class (done automatically on exit). -- procedure Destroy_Class is begin Destroy_Widget_Class (Widget_Class); Widget_Class := null; end; -- -- Initialize a widget instance. -- procedure Init (Object : OBJ.Object_Access_t) is CW : constant C_obj.Object_Pointer := C_obj.To_Pointer(Object.all'Address); begin T_IO.Put_Line("Custom widget init"); CW.Color := 16#c0c0c0#; CW.State_X := 1; CW.State_Y := 10; CW.Label_Surf := -1; end; -- -- Render the widget to the display. -- procedure Draw (Widget : Widget_Access_t) is CW : constant C_obj.Object_Pointer := C_obj.To_Pointer(Widget.all'Address); begin -- -- Render a 3d-style box and a line across it. -- Agar.Primitives.Draw_Box (X => 0, Y => 0, Width => Widget.W, Height => Widget.H, Z => 1, Color => Widget_Color(Background_Color)); Agar.Primitives.Draw_Line (X1 => 0, Y1 => 0, X2 => Widget.W, Y2 => Widget.H, Color => Widget_Color(Line_Color)); -- -- Render a text label. We generate and map the surface on demand so that -- it be stored efficiently as a hardware texture when possible. -- if CW.Label_Surf = -1 then CW.Label_Surf := Map_Surface (Widget => Widget, Surface => Agar.Text.Render("Hello"))); end if; if CW.Label_Surf /= -1 then Blit_Surface (Widget => Widget, Surface => CW.Label_Surf, X => Widget.W/2 - Surface_Width(CW.Label.Surf), Y => Widget.H/2 - Surface_Height(CW.Label.Surf)); end if; end; -- -- Request an initial preferred widget geometry. -- procedure Size_Request (Widget : in Widget_Access_t; Size : in SizeReq_not_null_Access_t) is begin Size.W := 320; Size.H := 240; end; -- -- Callback after final widget geometry has been allocated by the parent -- container. If Widget is a container itself, this is also where the -- effective geometry of the attached child widgets is determined. -- function Size_Allocate (Widget : in Widget_Access_t; Size : in SizeAlloc_not_null_Access_t) return C.int is begin if Size.W < 160 or Size.H < 120 then -- Require a minimum size return -1; end if; -- Allocate the geometry of any child widgets here. return 0; end; end CustomWidget;
zhmu/ananas
Ada
4,119
ads
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- F M A P -- -- -- -- S p e c -- -- -- -- Copyright (C) 2001-2022, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License -- -- for more details. You should have received a copy of the GNU General -- -- Public License distributed with GNAT; see file COPYING3. If not, go to -- -- http://www.gnu.org/licenses for a complete copy of the license. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This package keeps two mappings: from unit names to file names, -- and from file names to path names. -- -- This mapping is used to communicate between the builder (gnatmake or -- gprbuild) and the compiler. The format of this mapping file is the -- following: -- For each source file, there are three lines in the mapping file: -- Unit name with %b or %s added depending on whether it is a body or a spec -- This line is omitted for file-based languages -- File name -- Path name (set to '/' if the file should be ignored in fact, ie for -- a Locally_Removed_File in a project) with Namet; use Namet; package Fmap is procedure Initialize (File_Name : String); -- Initialize the mappings from the mapping file File_Name. -- If the mapping file is incorrect (nonexistent file, truncated file, -- duplicate entries), output a warning and do not initialize the mappings. -- Record the state of the mapping tables in case Update is called -- later on. function Mapped_Path_Name (File : File_Name_Type) return File_Name_Type; -- Return the path name mapped to the file name File. -- Return No_File if File is not mapped. function Mapped_File_Name (Unit : Unit_Name_Type) return File_Name_Type; -- Return the file name mapped to the unit name Unit. -- Return No_File if Unit is not mapped. -- Return Error_Name if it is forbidden. procedure Add_To_File_Map (Unit_Name : Unit_Name_Type; File_Name : File_Name_Type; Path_Name : File_Name_Type); -- Add mapping of Unit_Name to File_Name and of File_Name to Path_Name procedure Update_Mapping_File (File_Name : String); -- If Add_To_File_Map has been called (after Initialize or any time -- if Initialize has not been called), append the new entries to the -- mapping file whose file name is File_Name. procedure Reset_Tables; -- Initialize all the internal data structures procedure Add_Forbidden_File_Name (Name : File_Name_Type); -- Indicate that a source file name is forbidden. This is used when there -- are excluded sources in projects (attributes Excluded_Source_Files or -- Locally_Removed_Files). end Fmap;
stcarrez/ada-servlet
Ada
5,980
adb
----------------------------------------------------------------------- -- servlet-security-filters-oauth -- OAuth Security filter -- Copyright (C) 2017, 2018, 2022 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Strings.Fixed; with Util.Log.Loggers; package body Servlet.Security.Filters.OAuth is use Ada.Strings.Unbounded; use Servers; -- The logger Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("Security.Filters.OAuth"); function Get_Access_Token (Request : in Servlet.Requests.Request'Class) return String; -- ------------------------------ -- Called by the servlet container to indicate to a servlet that the servlet -- is being placed into service. -- ------------------------------ overriding procedure Initialize (Server : in out Auth_Filter; Config : in Servlet.Core.Filter_Config) is begin null; end Initialize; -- ------------------------------ -- Set the authorization manager that must be used to verify the OAuth token. -- ------------------------------ procedure Set_Auth_Manager (Filter : in out Auth_Filter; Manager : in Servers.Auth_Manager_Access) is begin Filter.Realm := Manager; end Set_Auth_Manager; function Get_Access_Token (Request : in Servlet.Requests.Request'Class) return String is Header : constant String := Request.Get_Header (AUTHORIZATION_HEADER_NAME); begin if Header'Length < 7 or else Header (Header'First .. Header'First + 6) /= "Bearer " then return ""; end if; return Ada.Strings.Fixed.Trim (Header (Header'First + 7 .. Header'Last), Ada.Strings.Both); end Get_Access_Token; -- ------------------------------ -- Filter the request to make sure the user is authenticated. -- Invokes the <b>Do_Login</b> procedure if there is no user. -- If a permission manager is defined, check that the user has the permission -- to view the page. Invokes the <b>Do_Deny</b> procedure if the permission -- is denied. -- ------------------------------ overriding procedure Do_Filter (F : in Auth_Filter; Request : in out Servlet.Requests.Request'Class; Response : in out Servlet.Responses.Response'Class; Chain : in out Servlet.Core.Filter_Chain) is Servlet : constant String := Request.Get_Servlet_Path; URL : constant String := Servlet & Request.Get_Path_Info; begin if F.Realm = null then Log.Error ("Deny access on {0} due to missing realm", URL); Auth_Filter'Class (F).Do_Deny (Request, Response); return; end if; declare Bearer : constant String := Get_Access_Token (Request); -- Auth : Principal_Access; Grant : Servers.Grant_Type; begin if Bearer'Length = 0 then Log.Info ("Ask authentication on {0} due to missing access token", URL); -- Auth_Filter'Class (F).Do_Login (Request, Response); Core.Do_Filter (Chain => Chain, Request => Request, Response => Response); return; end if; F.Realm.Authenticate (Bearer, Grant); if Grant.Status /= Valid_Grant then Log.Info ("Ask authentication on {0} due to missing access token", URL); Auth_Filter'Class (F).Do_Deny (Request, Response); return; end if; Request.Set_User_Principal (Grant.Auth.all'Access); Core.Do_Filter (Chain => Chain, Request => Request, Response => Response); end; end Do_Filter; -- ------------------------------ -- Display or redirects the user to the login page. This procedure is called when -- the user is not authenticated. -- ------------------------------ procedure Do_Login (F : in Auth_Filter; Request : in out Servlet.Requests.Request'Class; Response : in out Servlet.Responses.Response'Class) is pragma Unreferenced (Request); begin Response.Send_Error (Servlet.Responses.SC_UNAUTHORIZED); Response.Add_Header (WWW_AUTHENTICATE_HEADER_NAME, "Bearer realm=""" & To_String (F.Realm_URL) & """, error=""invalid_token"""); end Do_Login; -- ------------------------------ -- Display the forbidden access page. This procedure is called when the user is not -- authorized to see the page. The default implementation returns the SC_FORBIDDEN error. -- ------------------------------ procedure Do_Deny (F : in Auth_Filter; Request : in out Servlet.Requests.Request'Class; Response : in out Servlet.Responses.Response'Class) is pragma Unreferenced (Request); begin Response.Add_Header (WWW_AUTHENTICATE_HEADER_NAME, "Bearer realm=""" & To_String (F.Realm_URL) & """, error=""invalid_token"""); Response.Set_Status (Servlet.Responses.SC_FORBIDDEN); end Do_Deny; end Servlet.Security.Filters.OAuth;
sungyeon/drake
Ada
3,772
ads
pragma License (Unrestricted); with Ada.Strings.Maps; package Ada.Strings.Wide_Maps is pragma Preelaborate; -- Representation for a set of Wide_Character values: -- modified -- type Wide_Character_Set is private; subtype Wide_Character_Set is Maps.Character_Set; -- modified -- Null_Set : constant Wide_Character_Set; function Null_Set return Wide_Character_Set renames Maps.Null_Set; -- type Wide_Character_Range is record -- Low : Wide_Character; -- High : Wide_Character; -- end record; subtype Wide_Character_Range is Maps.Wide_Character_Range; -- Represents Wide_Character range Low..High -- type Wide_Character_Ranges is -- array (Positive range <>) of Wide_Character_Range; subtype Wide_Character_Ranges is Maps.Wide_Character_Ranges; function To_Set (Ranges : Wide_Character_Ranges) return Wide_Character_Set renames Maps.Overloaded_To_Set; function To_Set (Span : Wide_Character_Range) return Wide_Character_Set renames Maps.Overloaded_To_Set; function To_Ranges (Set : Wide_Character_Set) return Wide_Character_Ranges renames Maps.Overloaded_To_Ranges; function "=" (Left, Right : Wide_Character_Set) return Boolean renames Maps."="; function "not" (Right : Wide_Character_Set) return Wide_Character_Set renames Maps."not"; function "and" (Left, Right : Wide_Character_Set) return Wide_Character_Set renames Maps."and"; function "or" (Left, Right : Wide_Character_Set) return Wide_Character_Set renames Maps."or"; function "xor" (Left, Right : Wide_Character_Set) return Wide_Character_Set renames Maps."xor"; function "-" (Left, Right : Wide_Character_Set) return Wide_Character_Set renames Maps."-"; function Is_In ( Element : Wide_Character; Set : Wide_Character_Set) return Boolean renames Maps.Overloaded_Is_In; function Is_Subset ( Elements : Wide_Character_Set; Set : Wide_Character_Set) return Boolean renames Maps.Is_Subset; function "<=" ( Left : Wide_Character_Set; Right : Wide_Character_Set) return Boolean renames Maps.Is_Subset; -- Alternative representation for a set of Wide_Character values: subtype Wide_Character_Sequence is Wide_String; function To_Set (Sequence : Wide_Character_Sequence) return Wide_Character_Set renames Maps.Overloaded_To_Set; function To_Set (Singleton : Wide_Character) return Wide_Character_Set renames Maps.Overloaded_To_Set; function To_Sequence (Set : Wide_Character_Set) return Wide_Character_Sequence renames Maps.Overloaded_To_Sequence; -- Representation for a Wide_Character to -- Wide_Character mapping: -- modified -- type Wide_Character_Mapping is private; subtype Wide_Character_Mapping is Maps.Character_Mapping; function Value ( Map : Wide_Character_Mapping; Element : Wide_Character) return Wide_Character renames Maps.Overloaded_Value; -- modified -- Identity : constant Wide_Character_Mapping; function Identity return Wide_Character_Mapping renames Maps.Identity; function To_Mapping (From, To : Wide_Character_Sequence) return Wide_Character_Mapping renames Maps.Overloaded_To_Mapping; function To_Domain (Map : Wide_Character_Mapping) return Wide_Character_Sequence renames Maps.Overloaded_To_Domain; function To_Range (Map : Wide_Character_Mapping) return Wide_Character_Sequence renames Maps.Overloaded_To_Range; type Wide_Character_Mapping_Function is access function (From : Wide_Character) return Wide_Character; end Ada.Strings.Wide_Maps;
damaki/SPARKNaCl
Ada
3,500
adb
with SPARKNaCl.Scalar; with SPARKNaCl.Secretbox; package body SPARKNaCl.Cryptobox with SPARK_Mode => On is procedure Keypair (Raw_SK : in Bytes_32; PK : out Public_Key; SK : out Secret_Key) is begin SK.F := Raw_SK; PK.F := Scalar.Mult_Base (Raw_SK); end Keypair; function Construct (K : in Bytes_32) return Secret_Key is begin return Secret_Key'(F => K); end Construct; function Construct (K : in Bytes_32) return Public_Key is begin return Public_Key'(F => K); end Construct; function Serialize (K : in Secret_Key) return Bytes_32 is begin return K.F; end Serialize; function Serialize (K : in Public_Key) return Bytes_32 is begin return K.F; end Serialize; procedure Sanitize (K : out Secret_Key) is begin Sanitize (K.F); end Sanitize; procedure Sanitize (K : out Public_Key) is begin Sanitize (K.F); end Sanitize; procedure BeforeNM (K : out Core.Salsa20_Key; PK : in Public_Key; SK : in Secret_Key) is S : Bytes_32; LK : Bytes_32; begin S := Scalar.Mult (SK.F, PK.F); Core.HSalsa20 (Output => LK, Input => Zero_Bytes_16, K => Core.Construct (S), C => Sigma); Core.Construct (K, LK); pragma Warnings (GNATProve, Off, "statement has no effect"); Sanitize (S); Sanitize (LK); pragma Unreferenced (S, LK); end BeforeNM; procedure AfterNM (C : out Byte_Seq; Status : out Boolean; M : in Byte_Seq; N : in Stream.HSalsa20_Nonce; K : in Core.Salsa20_Key) is begin Secretbox.Create (C, Status, M, N, K); end AfterNM; procedure Open_AfterNM (M : out Byte_Seq; -- Output plaintext Status : out Boolean; C : in Byte_Seq; -- Input ciphertext N : in Stream.HSalsa20_Nonce; K : in Core.Salsa20_Key) is begin Secretbox.Open (M, Status, C, N, K); end Open_AfterNM; procedure Create (C : out Byte_Seq; Status : out Boolean; M : in Byte_Seq; N : in Stream.HSalsa20_Nonce; Recipient_PK : in Public_Key; Sender_SK : in Secret_Key) is K : Core.Salsa20_Key; begin BeforeNM (K, Recipient_PK, Sender_SK); AfterNM (C, Status, M, N, K); pragma Warnings (GNATProve, Off, "statement has no effect"); Core.Sanitize (K); pragma Unreferenced (K); end Create; procedure Open (M : out Byte_Seq; Status : out Boolean; C : in Byte_Seq; N : in Stream.HSalsa20_Nonce; Sender_PK : in Public_Key; Recipient_SK : in Secret_Key) is K : Core.Salsa20_Key; begin BeforeNM (K, Sender_PK, Recipient_SK); Open_AfterNM (M, Status, C, N, K); pragma Warnings (GNATProve, Off, "statement has no effect"); Core.Sanitize (K); pragma Unreferenced (K); end Open; end SPARKNaCl.Cryptobox;
io7m/coreland-posix-ada
Ada
618
adb
with Ada.Text_IO; with POSIX.Error; use type POSIX.Error.Error_t; procedure T_Em1 is package Text_IO renames Ada.Text_IO; Message : POSIX.Error.Message_t; Last_Index : POSIX.Error.Message_Index_t; begin for Error_Value in POSIX.Error.Error_t range POSIX.Error.Error_t'First .. POSIX.Error.Error_t'Last loop POSIX.Error.Message (Error_Value => Error_Value, Message_Buffer => Message, Last_Index => Last_Index); if POSIX.Error.Message_Index_t'First /= Last_Index then Text_IO.Put_Line (Message (Message'First .. Last_Index)); end if; end loop; end T_Em1;
riccardo-bernardini/eugen
Ada
1,167
adb
pragma Ada_2012; package body Line_Parsers.Receivers is ------------- -- Receive -- ------------- overriding procedure Receive (Handler : in out String_Receiver; Name : String; Value : String; Position : Natural) is pragma Unreferenced (Name, Position); begin Handler.Value := To_Unbounded_String (Value); Handler.Set := True; end Receive; ------------- -- Receive -- ------------- procedure Receive (Handler : in out Integer_Receiver; Name : String; Value : String; Position : Natural) is pragma Unreferenced (Name, Position); begin Handler.Value := Integer'Value (Value); Handler.Set := True; end Receive; ------------- -- Receive -- ------------- procedure Receive (Handler : in out Float_Receiver; Name : String; Value : String; Position : Natural) is pragma Unreferenced (Name, Position); begin Handler.Value := Float'Value (Value); Handler.Set := True; end Receive; end Line_Parsers.Receivers;
dan76/Amass
Ada
1,618
ads
-- Copyright © by Jeff Foley 2017-2023. All rights reserved. -- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file. -- SPDX-License-Identifier: Apache-2.0 local json = require("json") name = "ZETAlytics" type = "api" function start() set_rate_limit(5) end function check() local c local cfg = datasrc_config() if (cfg ~= nil) then c = cfg.credentials end if (c ~= nil and c.key ~= nil and c.key ~= "") then return true end return false end function vertical(ctx, domain) local c local cfg = datasrc_config() if (cfg ~= nil) then c = cfg.credentials end if (c == nil or c.key == nil or c.key == "") then return end local resp, err = request(ctx, {['url']=build_url(domain, c.key)}) if (err ~= nil and err ~= "") then log(ctx, "vertical request to service failed: " .. err) return elseif (resp.status_code < 200 or resp.status_code >= 400) then log(ctx, "vertical request to service returned with status: " .. resp.status) return end local d = json.decode(resp.body) if (d == nil) then log(ctx, "failed to decode the JSON response") return elseif (d.results == nil or #(d.results) == 0) then return end for _, r in pairs(d.results) do if (r ~= nil and r.qname ~= nil and r.qname ~= "") then send_names(ctx, r.qname) end end end function build_url(domain, key) return "https://zonecruncher.com/api/v1/subdomains?q=" .. domain .. "&token=" .. key end
strenkml/EE368
Ada
31,651
adb
with Ada.Text_IO; use Ada.Text_IO; with Ada.Assertions; use Ada.Assertions; with Ada.Unchecked_Deallocation; with Ada.Numerics.Generic_Elementary_Functions; with Memory.Cache; use Memory.Cache; with Memory.SPM; use Memory.SPM; with Memory.Transform; use Memory.Transform; with Memory.Transform.Flip; use Memory.Transform.Flip; with Memory.Transform.Offset; use Memory.Transform.Offset; with Memory.Transform.Shift; use Memory.Transform.Shift; with Memory.Transform.EOR; use Memory.Transform.EOR; with Memory.Prefetch; use Memory.Prefetch; with Memory.Split; use Memory.Split; with Memory.Join; use Memory.Join; with Memory.Register; use Memory.Register; with Memory.Option; use Memory.Option; with Applicative; use Applicative; with Simplify_Memory; with Variance; package body Memory.Super is package LF_Math is new Ada.Numerics.Generic_Elementary_Functions(Long_Float); function Create_Memory(mem : Super_Type; next : access Memory_Type'Class; cost : Cost_Type; in_bank : Boolean) return Memory_Pointer; function Create_Split(mem : Super_Type; next : access Memory_Type'Class; cost : Cost_Type; in_bank : Boolean) return Memory_Pointer; function Create_Transform(mem : Super_Type; next : access Memory_Type'Class; cost : Cost_Type; in_bank : Boolean) return Memory_Pointer; function Create_Memory(mem : Super_Type; next : access Memory_Type'Class; cost : Cost_Type; in_bank : Boolean) return Memory_Pointer is tcost : constant Cost_Type := cost + Get_Cost(next.all); result : Memory_Pointer := null; begin case Random(mem.generator.all) mod 8 is when 0 => result := Create_Transform(mem, next, cost, in_bank); when 1 => if mem.has_idle then result := Random_Prefetch(next, mem.generator.all, tcost); else result := Create_Memory(mem, next, cost, in_bank); end if; when 2 => result := Random_SPM(next, mem.generator.all, tcost); when 3 => result := Random_Cache(next, mem.generator.all, tcost); when 4 => result := Create_Split(mem, next, cost, in_bank); when others => result := Create_Memory(mem, next, cost, in_bank); end case; Assert(result /= null, "Memory.Super.Create_Memory returning null"); return result; end Create_Memory; function Create_Split(mem : Super_Type; next : access Memory_Type'Class; cost : Cost_Type; in_bank : Boolean) return Memory_Pointer is result : Split_Pointer; join0 : Join_Pointer; join1 : Join_Pointer; begin result := Split_Pointer(Random_Split(next, mem.generator.all, cost)); join0 := Create_Join(result, 0); join1 := Create_Join(result, 1); Set_Bank(result.all, 0, join0); Set_Bank(result.all, 1, join1); return Memory_Pointer(result); end Create_Split; function Create_Transform(mem : Super_Type; next : access Memory_Type'Class; cost : Cost_Type; in_bank : Boolean) return Memory_Pointer is result : Memory_Pointer; trans : Transform_Pointer; join : Join_Pointer; begin case Random(mem.generator.all) mod 4 is when 0 => result := Random_Flip(next, mem.generator.all, cost); when 1 => result := Random_Offset(next, mem.generator.all, cost); when 2 => result := Random_EOR(next, mem.generator.all, cost); when others => result := Random_Shift(next, mem.generator.all, cost); end case; trans := Transform_Pointer(result); if in_bank or else (Random(mem.generator.all) mod 2) = 0 then join := Create_Join(trans, 0); Set_Bank(trans.all, join); end if; return result; end Create_Transform; function Clone(mem : Super_Type) return Memory_Pointer is result : constant Super_Pointer := new Super_Type'(mem); begin return Memory_Pointer(result); end Clone; function Done(mem : Super_Type) return Boolean is begin return mem.iteration >= mem.max_iterations; end Done; function Count_Memories(ptr : Memory_Pointer) return Natural is begin if ptr /= null then if ptr.all in Split_Type'Class then declare sp : constant Split_Pointer := Split_Pointer(ptr); a : constant Memory_Pointer := Get_Bank(sp.all, 0); ac : constant Natural := Count_Memories(a); b : constant Memory_Pointer := Get_Bank(sp.all, 1); bc : constant Natural := Count_Memories(b); n : constant Memory_Pointer := Get_Memory(sp.all); nc : constant Natural := Count_Memories(n); begin return 1 + ac + bc + nc; end; elsif ptr.all in Transform_Type'Class then declare tp : constant Transform_Pointer := Transform_Pointer(ptr); bp : constant Memory_Pointer := Get_Bank(tp.all); bc : constant Natural := Count_Memories(bp); np : constant Memory_Pointer := Get_Memory(tp.all); nc : constant Natural := Count_Memories(np); begin return 1 + bc + nc; end; elsif ptr.all in Container_Type'Class then declare cp : constant Container_Pointer := Container_Pointer(ptr); begin return 1 + Count_Memories(Get_Memory(cp.all)); end; elsif ptr.all in Join_Type'Class then return 1; elsif ptr.all in Option_Type'Class then return 1; end if; end if; return 0; end Count_Memories; procedure Reset(mem : in out Super_Type; context : in Natural) is begin for i in Natural(mem.contexts.Length) .. context loop declare cp : constant Context_Pointer := new Context_Type; begin cp.index := i; mem.contexts.Append(cp); end; end loop; mem.current_length := 0; mem.context := mem.contexts.Element(context); Reset(Container_Type(mem), context); end Reset; procedure Read(mem : in out Super_Type; address : in Address_Type; size : in Positive) is begin mem.current_length := mem.current_length + 1; Read(Container_Type(mem), address, size); if mem.total = 0 then Insert(mem.generator.all, address, size); elsif Get_Value(mem'Access) >= mem.best_value * 2 then if mem.current_length > mem.context.total_length / 4 then if mem.contexts.Length = 1 then raise Prune_Error; end if; end if; end if; end Read; procedure Write(mem : in out Super_Type; address : in Address_Type; size : in Positive) is begin mem.current_length := mem.current_length + 1; Write(Container_Type(mem), address, size); if mem.total = 0 then Insert(mem.generator.all, address, size); elsif Get_Value(mem'Access) >= mem.best_value * 2 then if mem.current_length > mem.context.total_length / 4 then if mem.contexts.Length = 1 then raise Prune_Error; end if; end if; end if; end Write; procedure Idle(mem : in out Super_Type; cycles : in Time_Type) is begin if cycles > 0 then mem.has_idle := True; Idle(Container_Type(mem), cycles); end if; end Idle; procedure Remove_Memory(ptr : in out Memory_Pointer; index : in Natural; updated : out Boolean) is begin Assert(ptr /= null, "null ptr in Remove_Memory"); if index = 0 then if ptr.all in Split_Type'Class then declare sp : constant Split_Pointer := Split_Pointer(ptr); b0 : constant Memory_Pointer := Get_Bank(sp.all, 0); b1 : constant Memory_Pointer := Get_Bank(sp.all, 1); next : constant Memory_Pointer := Get_Memory(sp.all); begin if b0.all in Join_Type'Class and b1.all in Join_Type'Class then Set_Memory(sp.all, null); Destroy(ptr); ptr := next; updated := True; else updated := False; end if; end; elsif ptr.all in Container_Type'Class then declare cp : constant Container_Pointer := Container_Pointer(ptr); next : constant Memory_Pointer := Get_Memory(cp.all); begin Set_Memory(cp.all, null); Destroy(ptr); ptr := next; updated := True; end; elsif ptr.all in Join_Type'Class then updated := False; elsif ptr.all in Option_Type'Class then updated := False; else Destroy(ptr); ptr := null; updated := True; end if; elsif ptr.all in Split_Type'Class then declare sp : constant Split_Pointer := Split_Pointer(ptr); a : Memory_Pointer := Get_Bank(sp.all, 0); ac : constant Natural := Count_Memories(a); b : Memory_Pointer := Get_Bank(sp.all, 1); bc : constant Natural := Count_Memories(b); n : Memory_Pointer := Get_Memory(sp.all); begin if 1 + ac > index then Remove_Memory(a, index - 1, updated); Set_Bank(sp.all, 0, a); elsif 1 + ac + bc > index then Remove_Memory(b, index - ac - 1, updated); Set_Bank(sp.all, 1, b); else Remove_Memory(n, index - ac - bc - 1, updated); Set_Memory(sp.all, n); end if; end; elsif ptr.all in Transform_Type'Class then declare tp : constant Transform_Pointer := Transform_Pointer(ptr); bank : Memory_Pointer := Get_Bank(tp.all); count : constant Natural := Count_Memories(bank); next : Memory_Pointer := Get_Memory(tp.all); begin if 1 + count > index then Remove_Memory(bank, index - 1, updated); Set_Bank(tp.all, bank); else Remove_Memory(next, index - count - 1, updated); Set_Memory(tp.all, next); end if; end; elsif ptr.all in Container_Type'Class then declare cp : constant Container_Pointer := Container_Pointer(ptr); n : Memory_Pointer := Get_Memory(cp.all); begin Remove_Memory(n, index - 1, updated); Set_Memory(cp.all, n); end; else updated := False; end if; end Remove_Memory; procedure Insert_Memory(mem : in Super_Type; ptr : in out Memory_Pointer; index : in Natural; cost : in Cost_Type; in_bank : in Boolean) is begin Assert(ptr /= null, "null ptr in Insert_Memory"); if index = 0 then -- Insert other before ptr. ptr := Create_Memory(mem, ptr, cost, in_bank); elsif ptr.all in Split_Type'Class then declare sp : constant Split_Pointer := Split_Pointer(ptr); a : Memory_Pointer := Get_Bank(sp.all, 0); ac : constant Natural := Count_Memories(a); b : Memory_Pointer := Get_Bank(sp.all, 1); bc : constant Natural := Count_Memories(b); n : Memory_Pointer := Get_Memory(sp.all); begin if 1 + ac > index then -- Insert to the first bank. Push_Limit(mem.generator.all, 0, Get_Offset(sp.all)); Insert_Memory(mem, a, index - 1, cost, True); Pop_Limit(mem.generator.all); Set_Bank(sp.all, 0, a); elsif 1 + ac + bc > index then -- Insert to the second bank. Push_Limit(mem.generator.all, Get_Offset(sp.all), Address_Type'Last); Insert_Memory(mem, b, index - ac - 1, cost, True); Pop_Limit(mem.generator.all); Set_Bank(sp.all, 1, b); else -- Insert after the split. Insert_Memory(mem, n, index - ac - bc - 1, cost, in_bank); Set_Memory(sp.all, n); end if; end; elsif ptr.all in Transform_Type'Class then declare tp : constant Transform_Pointer := Transform_Pointer(ptr); bank : Memory_Pointer := Get_Bank(tp.all); count : constant Natural := Count_Memories(bank); next : Memory_Pointer := Get_Memory(tp.all); begin if 1 + count > index then -- Insert to the bank. Push_Transform(mem.generator.all, Applicative_Pointer(tp)); Insert_Memory(mem, bank, index - 1, cost, True); Pop_Transform(mem.generator.all); Set_Bank(tp.all, bank); else -- Insert after the transform. if Get_Bank(tp.all) = null then Push_Transform(mem.generator.all, Applicative_Pointer(tp)); Insert_Memory(mem, next, index - count - 1, cost, in_bank); Pop_Transform(mem.generator.all); else Insert_Memory(mem, next, index - count - 1, cost, in_bank); end if; Set_Memory(tp.all, next); end if; end; elsif ptr.all in Container_Type'Class then declare cp : constant Container_Pointer := Container_Pointer(ptr); n : Memory_Pointer := Get_Memory(cp.all); begin Insert_Memory(mem, n, index - 1, cost, in_bank); Set_Memory(cp.all, n); end; end if; end Insert_Memory; function Permute_Memory(mem : in Super_Type; ptr : in Memory_Pointer; index : in Natural; cost : in Cost_Type) return Boolean is begin Assert(ptr /= null, "null ptr in Permute_Memory"); if index = 0 then Permute(ptr.all, mem.generator.all, cost + Get_Cost(ptr.all)); return ptr.all not in Join_Type'Class; elsif ptr.all in Split_Type'Class then declare sp : constant Split_Pointer := Split_Pointer(ptr); a : constant Memory_Pointer := Get_Bank(sp.all, 0); ac : constant Natural := Count_Memories(a); b : constant Memory_Pointer := Get_Bank(sp.all, 1); bc : constant Natural := Count_Memories(b); n : constant Memory_Pointer := Get_Memory(sp.all); rc : Boolean; begin if 1 + ac > index then Push_Limit(mem.generator.all, 0, Get_Offset(sp.all)); rc := Permute_Memory(mem, a, index - 1, cost); Pop_Limit(mem.generator.all); elsif 1 + ac + bc > index then Push_Limit(mem.generator.all, Get_Offset(sp.all), Address_Type'Last); rc := Permute_Memory(mem, b, index - ac - 1, cost); Pop_Limit(mem.generator.all); else rc := Permute_Memory(mem, n, index - ac - bc - 1, cost); end if; return rc; end; elsif ptr.all in Transform_Type'Class then declare tp : constant Transform_Pointer := Transform_Pointer(ptr); bank : constant Memory_Pointer := Get_Bank(tp.all); count : constant Natural := Count_Memories(bank); next : constant Memory_Pointer := Get_Memory(tp.all); rc : Boolean; begin if 1 + count > index then Push_Transform(mem.generator.all, Applicative_Pointer(tp)); rc := Permute_Memory(mem, bank, index - 1, cost); Pop_Transform(mem.generator.all); else if Get_Bank(tp.all) = null then Push_Transform(mem.generator.all, Applicative_Pointer(tp)); rc := Permute_Memory(mem, next, index - count - 1, cost); Pop_Transform(mem.generator.all); else rc := Permute_Memory(mem, next, index - count - 1, cost); end if; end if; return rc; end; elsif ptr.all in Container_Type'Class then declare cp : constant Container_Pointer := Container_Pointer(ptr); n : constant Memory_Pointer := Get_Memory(cp.all); begin return Permute_Memory(mem, n, index - 1, cost); end; else Assert(False, "invalid type in Permute_Memory"); return False; end if; end Permute_Memory; procedure Randomize(mem : in Super_Type; ptr : in out Memory_Pointer) is len : constant Natural := Count_Memories(ptr); pos : Natural; rc : Boolean; cost : constant Cost_Type := Get_Cost(ptr.all); left : constant Cost_Type := mem.max_cost - cost; begin -- Select an action to take. -- Here we give extra weight to modifying an existing subsystem -- rather than adding or removing components. if mem.permute_only then loop pos := Random(mem.generator.all) mod len; if Permute_Memory(mem, ptr, pos, left) then exit when Get_Cost(ptr.all) <= mem.max_cost; end if; end loop; else case Random(mem.generator.all) mod 32 is when 0 => -- Insert a component. pos := Random(mem.generator.all) mod (len + 1); Insert_Memory(mem, ptr, pos, left, False); when 1 | 2 => -- Remove a component. if len = 0 then Insert_Memory(mem, ptr, 0, left, False); else for i in 1 .. 10 loop pos := Random(mem.generator.all) mod len; Remove_Memory(ptr, pos, rc); exit when rc; end loop; end if; when others => -- Modify a component. if len = 0 then Insert_Memory(mem, ptr, 0, left, False); else loop pos := Random(mem.generator.all) mod len; if Permute_Memory(mem, ptr, pos, left) then exit when Get_Cost(ptr.all) <= mem.max_cost; end if; end loop; end if; end case; end if; Assert(Get_Cost(mem) <= mem.max_cost, "Invalid randomize"); end Randomize; function Create_Super(mem : not null access Memory_Type'Class; max_cost : Cost_Type; seed : Integer; max_iterations : Long_Integer; permute_only : Boolean) return Super_Pointer is result : Super_Pointer; begin if Get_Cost(mem.all) > max_cost then return null; end if; result := new Super_Type; result.max_cost := max_cost; result.max_iterations := max_iterations; result.last := Memory_Pointer(mem); result.current := Clone(mem.all); result.generator := new Distribution_Type; result.permute_only := False; Set_Seed(result.generator.all, seed); Set_Memory(result.all, Clone(mem.all)); return result; end Create_Super; procedure Update_Memory(mem : in out Super_Type; result : in Result_Type) is eold : constant Long_Integer := Long_Integer(mem.last_value); enew : constant Long_Integer := Long_Integer(result.value); diff : constant Long_Integer := enew - eold; temp : Memory_Pointer; begin if mem.steps = 0 then mem.threshold := 1024; end if; if diff <= mem.threshold then -- Keep the current memory. for i in mem.contexts.First_Index .. mem.contexts.Last_Index loop declare cp : constant Context_Pointer := mem.contexts.Element(i); begin cp.last_value := result.context_values.Element(i); end; end loop; mem.last_value := result.value; Destroy(mem.last); mem.last := Clone(mem.current.all); -- Decrease the threshold. mem.threshold := mem.threshold - (mem.threshold + 1023) / 1024; mem.age := 0; else -- Revert to the previous memory. Destroy(mem.current); mem.current := Clone(mem.last.all); -- Increase the threshold. mem.threshold := mem.threshold + (mem.age * mem.threshold) / 2048; mem.threshold := mem.threshold + 1; mem.age := mem.age + 1; end if; mem.steps := mem.steps + 1; temp := Get_Memory(mem); Destroy(temp); Set_Memory(mem, null); Randomize(mem, mem.current); temp := Simplify_Memory(Clone(mem.current.all)); Insert_Registers(temp); Set_Memory(mem, temp); end Update_Memory; procedure Track_Best(mem : in out Super_Type; cost : in Cost_Type; value : in Value_Type) is simp_mem : Memory_Pointer; simp_cost : Cost_Type; simp_name : Unbounded_String; begin -- Value can't change from simplification, so we check it first. if value > mem.best_value then return; end if; -- Value is at least as good. -- The current memory being used is the simplified memory with -- registers inserted, so we use that. simp_mem := Get_Memory(mem); simp_cost := Get_Cost(simp_mem.all); -- If the value is the same, we will only accept the memory if -- the cost is at least as good. if value = mem.best_value and cost > mem.best_cost then return; end if; -- Get the name of the simplified memory. simp_name := To_String(simp_mem.all); -- If the cost and value are the same, we accept the memory -- only if the name is shorter. if value = mem.best_value and then cost = mem.best_cost and then Length(simp_name) > Length(mem.best_name) then return; end if; -- If we get here, we have a better memory subsystem. if mem.best_value < Value_Type'Last then -- Don't reset our count unless we are able to get at least -- 0.1% better since the last reset. mem.improvement := mem.improvement + mem.best_value - value; if mem.improvement > value / 1000 then mem.iteration := 0; mem.improvement := 0; end if; end if; mem.best_value := value; mem.best_cost := simp_cost; mem.best_name := simp_name; end Track_Best; procedure Cache_Result(mem : in out Super_Type; result : in Result_Type) is simp_mem : Memory_Pointer; simp_name : Unbounded_String; begin simp_mem := Simplify_Memory(Clone(mem.current.all)); simp_name := To_String(simp_mem.all); mem.table.Insert(simp_name, result); Destroy(simp_mem); end Cache_Result; function Check_Cache(mem : Super_Type) return Result_Type is simp_mem : Memory_Pointer; simp_name : Unbounded_String; cursor : Value_Maps.Cursor; begin simp_mem := Simplify_Memory(Clone(mem.current.all)); simp_name := To_String(simp_mem.all); Destroy(simp_mem); cursor := mem.table.Find(simp_name); if Value_Maps."="(cursor, Value_Maps.No_Element) then declare result : Result_Type; begin result.value := 0; return result; end; else return Value_Maps.Element(cursor); end if; end Check_Cache; package LF_Variance is new Variance(Long_Float); procedure Finish_Run(mem : in out Super_Type) is context : constant Context_Pointer := mem.context; cost : constant Cost_Type := Get_Cost(mem); value : Value_Type := Get_Value(mem'Access); sum : Long_Float; count : Long_Float; total : Long_Integer; var : LF_Variance.Variance_Type; result : Result_Type; begin -- Scale the result if necessary. if mem.current_length > context.total_length then context.total_length := mem.current_length; end if; if mem.current_length /= context.total_length then Put_Line("Prune"); declare mult : constant Long_Float := Long_Float(context.total_length) / Long_Float(mem.current_length); fval : constant Long_Float := Long_Float(value) * mult; begin if fval >= Long_Float(Value_Type'Last) then value := Value_Type'Last; else value := Value_Type(fval); end if; end; if value < mem.best_value then Put_Line("Prune overflow"); value := mem.best_value + 1; end if; end if; context.value := value; -- Return early if there are more contexts to process. if context.index > 0 then return; end if; -- We now have data for all benchmarks. -- Determine the average value (geometric mean). count := 0.0; sum := 0.0; total := 0; for i in mem.contexts.First_Index .. mem.contexts.Last_Index loop declare cp : constant Context_Pointer := mem.contexts.Element(i); diff : Long_Float := 0.0; pdiff : Long_Float := 0.0; begin if cp.last_value /= Value_Type'Last then diff := Long_Float(cp.value) - Long_Float(cp.last_value); pdiff := diff / Long_Float(cp.total_length); LF_Variance.Update(var, pdiff); Put_Line(To_String(i) & ": " & Value_Type'Image(cp.value) & " (delta: " & To_String(pdiff) & ")"); end if; sum := sum + LF_Math.Log(Long_Float(cp.value)); count := count + 1.0; total := total + cp.total_length; end; end loop; value := Value_Type(LF_Math.Exp(sum / count)); -- Report the average. if mem.last_value /= Value_Type'Last then declare diff : constant Long_Float := Long_Float(value) - Long_Float(mem.last_value); pdiff : constant Long_Float := diff / Long_Float(total); v : constant Long_Float := LF_Variance.Get_Variance(var); begin Put_Line("Average:" & Value_Type'Image(value) & " (delta: " & To_String(pdiff) & ")"); Put_Line("Variance: " & To_String(v)); end; else Put_Line("Average:" & Value_Type'Image(value)); end if; Put_Line("Cost:" & Cost_Type'Image(cost)); -- Keep track of the best memory. Track_Best(mem, cost, value); Put_Line("Best Memory: " & To_String(mem.best_name)); Put_Line("Best Value: " & Value_Type'Image(mem.best_value)); Put_Line("Best Cost: " & Cost_Type'Image(mem.best_cost)); -- Keep track of the result of running with this memory. for i in mem.contexts.First_Index .. mem.contexts.Last_Index loop result.context_values.Append(mem.contexts.Element(i).value); end loop; result.value := value; Cache_Result(mem, result); -- Keep track of the number of iterations. mem.iteration := mem.iteration + 1; mem.total := mem.total + 1; if not Done(mem) then Put_Line("Iteration:" & Long_Integer'Image(mem.iteration + 1) & " (evaluation " & To_String(mem.total + 1) & ", steps " & To_String(mem.steps + 1) & ", threshold " & To_String(mem.threshold) & ", age " & To_String(mem.age) & ")"); -- Generate new memories until we find a new one. loop Update_Memory(mem, result); result := Check_Cache(mem); value := result.value; exit when value = 0; end loop; Put_Line(To_String(To_String(mem))); end if; end Finish_Run; procedure Show_Stats(mem : in out Super_Type) is begin Show_Access_Stats(mem); end Show_Stats; procedure Show_Access_Stats(mem : in out Super_Type) is begin Finish_Run(mem); end Show_Access_Stats; procedure Adjust(mem : in out Super_Type) is begin Adjust(Container_Type(mem)); mem.generator := new Distribution_Type; mem.last := null; mem.current := null; end Adjust; procedure Destroy is new Ada.Unchecked_Deallocation(Distribution_Type, Distribution_Pointer); procedure Destroy is new Ada.Unchecked_Deallocation(Context_Type, Context_Pointer); procedure Finalize(mem : in out Super_Type) is begin for i in mem.contexts.First_Index .. mem.contexts.Last_Index loop declare cp : Context_Pointer := mem.contexts.Element(i); begin Destroy(cp); end; end loop; Destroy(mem.generator); Destroy(mem.last); Destroy(mem.current); Finalize(Container_Type(mem)); end Finalize; end Memory.Super;
MinimSecure/unum-sdk
Ada
916
ads
-- Copyright 2014-2019 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. with System; package Pck is type Bounded is array (Integer range <>) of Integer; function New_Bounded (Low, High : Integer) return Bounded; procedure Do_Nothing (A : System.Address); end Pck;
reznikmm/matreshka
Ada
3,789
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Elements; package ODF.DOM.Text_Note_Continuation_Notice_Backward_Elements is pragma Preelaborate; type ODF_Text_Note_Continuation_Notice_Backward is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Text_Note_Continuation_Notice_Backward_Access is access all ODF_Text_Note_Continuation_Notice_Backward'Class with Storage_Size => 0; end ODF.DOM.Text_Note_Continuation_Notice_Backward_Elements;
onox/orka
Ada
6,747
adb
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2017 onox <[email protected]> -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. with Ada.Characters.Latin_1; with Ada.Strings.Fixed; with Orka.OS; with Orka.Strings; package body Orka.Terminals is Style_Codes : constant array (Style) of Natural := (Default => 0, Bold => 1, Dark => 2, Italic => 3, Underline => 4, Blink => 5, Reversed => 7, Cross_Out => 9); type Color_Kind is (FG, BG, None); type Color_Code is range 0 .. 255; type Color_Component is range 0 .. 5; type Color_Index is (R, G, B); type Color_RGB is array (Color_Index) of Color_Component; Colors : constant array (Color) of Color_RGB := (Default => (0, 0, 0), Grey => (2, 2, 2), Red => (4, 0, 0), Green => (1, 3, 0), Yellow => (4, 3, 0), Blue => (0, 1, 4), Magenta => (4, 0, 3), Cyan => (0, 4, 3), White => (4, 4, 4)); package L1 renames Ada.Characters.Latin_1; package SF renames Ada.Strings.Fixed; Reset : constant String := L1.ESC & "[0m"; function Sequence (Code : Natural) return String is Image : constant String := SF.Trim (Code'Image, Ada.Strings.Both); begin return (if Code /= 0 then L1.ESC & "[" & Image & "m" else ""); end Sequence; function Sequence (Kind : Color_Kind; Color : Color_RGB) return String is Code : constant Color_Code := Color_Code (16 + 36 * Color_Code (Color (R)) + 6 * Color_Code (Color (G)) + Color_Code (Color (B))); Image : constant String := SF.Trim (Code'Image, Ada.Strings.Both); begin return (case Kind is when FG => L1.ESC & "[38;5;" & Image & "m", when BG => L1.ESC & "[48;5;" & Image & "m", when None => ""); end Sequence; function Colorize (Text : String; Foreground, Background : Color := Default; Attribute : Style := Default) return String is FG_Kind : constant Color_Kind := (if Foreground /= Default then FG else None); BG_Kind : constant Color_Kind := (if Background /= Default then BG else None); FG : constant String := Sequence (FG_Kind, Colors (Foreground)); BG : constant String := Sequence (BG_Kind, Colors (Background)); ST : constant String := Sequence (Style_Codes (Attribute)); begin return Reset & FG & BG & ST & Text & Reset; end Colorize; ----------------------------------------------------------------------------- Time_Zero : Duration := 0.0; procedure Set_Time_Zero (Time : Duration) is begin Time_Zero := Time; end Set_Time_Zero; Day_In_Seconds : constant := 24.0 * 60.0 * 60.0; function Time_Image return String is Seconds_Since_Zero : Duration := Orka.OS.Monotonic_Clock - Time_Zero; Days_Since_Zero : Natural := 0; begin while Seconds_Since_Zero > Day_In_Seconds loop Seconds_Since_Zero := Seconds_Since_Zero - Day_In_Seconds; Days_Since_Zero := Days_Since_Zero + 1; end loop; declare Seconds_Rounded : constant Natural := Natural (Duration'Max (0.0, Seconds_Since_Zero - 0.5)); Hour : constant Natural := Seconds_Rounded / 3600; Minute : constant Natural := (Seconds_Rounded mod 3600) / 60; Second : constant Natural := Seconds_Rounded mod 60; Sub_Second : constant Duration := Seconds_Since_Zero - Duration (Hour * 3600 + Minute * 60 + Second); -- Remove first character (space) from ' hhmmss' image and then pad it to six digits Image1 : constant String := Natural'Image ((Days_Since_Zero * 24 + Hour) * 1e4 + Minute * 1e2 + Second); Image2 : constant String := SF.Tail (Image1 (2 .. Image1'Last), 6, '0'); -- Insert ':' characters to get 'hh:mm:ss' Image3 : constant String := SF.Insert (Image2, 5, ":"); Image4 : constant String := SF.Insert (Image3, 3, ":"); -- Take image without first character (space) and then pad it to six digits Image5 : constant String := Natural'Image (Natural (Sub_Second * 1e6)); Image6 : constant String := SF.Tail (Image5 (2 .. Image5'Last), 6, '0'); begin return Image4 & "." & Image6; end; end Time_Image; function Format (Value : Duration; Fore, Aft : Positive) return String is package SF renames Ada.Strings.Fixed; Aft_Shift : constant Positive := 10 ** Aft; New_Value : constant Duration := Duration (Integer (Value * Aft_Shift)) / Aft_Shift; S1 : constant String := SF.Trim (New_Value'Image, Ada.Strings.Both); Index_Decimal : constant Natural := SF.Index (S1, "."); -- Following code assumes that Aft >= 1 (If Aft = 0 then Aft must -- be decremented to remove the decimal point) S2 : constant String := S1 (S1'First .. Natural'Min (S1'Last, Index_Decimal + Aft)); S3 : constant String := SF.Tail (S2, Natural'Max (S2'Length, Fore + 1 + Aft), ' '); begin return S3; end Format; type String_Access is not null access String; Suffices : constant array (1 .. 3) of String_Access := (new String'("s"), new String'("ms"), new String'("us")); function Image (Value : Duration) return String is Number : Duration := Value; Last_Suffix : constant String_Access := Suffices (Suffices'Last); Suffix : String_Access := Suffices (Suffices'First); begin for S of Suffices loop Suffix := S; exit when Number >= 1.0 or else Number <= -1.0 or else S = Last_Suffix; Number := Number * 1e3; end loop; begin return Format (Number, Fore => 5, Aft => 3) & " " & Suffix.all; exception when others => return Number'Image & " " & Suffix.all; end; end Image; function Trim (Value : String) return String renames Orka.Strings.Trim; function Strip_Line_Term (Value : String) return String renames Orka.Strings.Strip_Line_Term; end Orka.Terminals;
AdaCore/libadalang
Ada
135
ads
generic type Element_Type is private; package Bar is procedure Proc (E : Element_Type); pragma Test (Element_Type); end Bar;
reznikmm/matreshka
Ada
3,689
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Attributes; package ODF.DOM.Db_Base_Dn_Attributes is pragma Preelaborate; type ODF_Db_Base_Dn_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Db_Base_Dn_Attribute_Access is access all ODF_Db_Base_Dn_Attribute'Class with Storage_Size => 0; end ODF.DOM.Db_Base_Dn_Attributes;
GPUWorks/lumen2
Ada
16,998
adb
-- Lumen.Font.Txf -- Display textual information using texture-mapped fonts -- -- Chip Richards, NiEstu, Phoenix AZ, Summer 2010 -- This code is covered by the ISC License: -- -- Copyright © 2010, NiEstu -- -- Permission to use, copy, modify, and/or distribute this software for any -- purpose with or without fee is hereby granted, provided that the above -- copyright notice and this permission notice appear in all copies. -- -- The software is provided "as is" and the author disclaims all warranties -- with regard to this software including all implied warranties of -- merchantability and fitness. In no event shall the author be liable for any -- special, direct, indirect, or consequential damages or any damages -- whatsoever resulting from loss of use, data or profits, whether in an -- action of contract, negligence or other tortious action, arising out of or -- in connection with the use or performance of this software. -- Environment with Ada.Unchecked_Deallocation; with System.Address_To_Access_Conversions; with Lumen.Binary.IO; with Lumen.Binary.Endian.Shorts; with Lumen.Binary.Endian.Words; with Lumen.GLU; package body Lumen.Font.Txf is --------------------------------------------------------------------------- -- Texture-mapped glyph vertex info type Texture_Coords is array (1 .. 4) of GL.Floats_2; type Vertices is array (1 .. 4) of GL.Shorts_2; type Txf_Vertex_Info is record Glyph : Natural; T : Texture_Coords; V : Vertices; Ascent : Integer; Descent : Integer; Advance : Float; end record; type Txf_Vertex_Table is array (Positive range <>) of Txf_Vertex_Info; -- Internal view of a font type Lookup_Table is array (Natural range <>) of Natural; type Font_Info (Glyphs : Natural; Size : Natural; Lo, Hi : Natural) is record Object : GL.UInt := 0; Width : Natural; Height : Natural; Ascent : Integer; Descent : Integer; Num_Glyphs : Natural; Verts : Txf_Vertex_Table (1 .. Glyphs); Lookup : Lookup_Table (Lo .. Hi); Image : Binary.Byte_String (1 .. Size); end record; --------------------------------------------------------------------------- -- Generic procedure to read an instance of a given type, confining all the -- ugliness of address thwacking to one place generic type Item_Type is private; procedure Read (File : in Lumen.Binary.IO.File_Type; Item : out Item_Type); procedure Read (File : in Lumen.Binary.IO.File_Type; Item : out Item_Type) is use Lumen.Binary; Buffer_Len : constant Natural := Item'Size / Byte_Bits; subtype Buffer_Type is Byte_String (1 .. Buffer_Len); package Address_Convert is new System.Address_To_Access_Conversions (Buffer_Type); Buffer : constant Address_Convert.Object_Pointer := Address_Convert.To_Pointer (Item'Address); begin -- Read Buffer.all := IO.Read (File, Buffer_Len); end Read; --------------------------------------------------------------------------- -- -- Package subroutines -- --------------------------------------------------------------------------- -- Fetch vertex info record for given glyph function Get_Vertex_Info (Font : in Handle; Glyph : in Natural) return Txf_Vertex_Info is begin -- Get_Vertex_Info -- Kilgard's code did automatic ASCII case folding here. Should we? if Glyph in Font.Info.Lookup'Range and then Font.Info.Lookup (Glyph) /= 0 then return Font.Info.Verts (Font.Info.Lookup (Glyph)); else raise No_Glyph with "glyph" & Natural'Image (Glyph) & " is not in this font"; end if; end Get_Vertex_Info; --------------------------------------------------------------------------- -- -- Public subroutines -- --------------------------------------------------------------------------- overriding procedure Finalize (Font : in out Handle) is begin -- Finalize if Font.Info /= null then Unload (Font); end if; end Finalize; --------------------------------------------------------------------------- -- Load a texture font procedure Load (Font : in out Handle; Pathname : in String) is use Lumen.Binary; -- Byte swapping for word-length values package Wrds is new Lumen.Binary.Endian.Words (Word); package Ints is new Lumen.Binary.Endian.Words (Integer); -- Traditional txf file header subtype Txf_Signature is String (1 .. 4); Txf_Signature_Mark : constant Txf_Signature := Character'Val (16#FF#) & "txf"; Txf_Endian_Mark : constant Word := 16#12345678#; -- should be an enum, just way easier like this Txf_Byte_Format : constant Word := 0; type Txf_Header is record Signature : Txf_Signature; Direction : Word; Format : Word; Width : Natural; Height : Natural; Ascent : Integer; Descent : Integer; Num_Glyphs : Natural; end record; for Txf_Header use record Signature at 0 * Word_Bytes range 0 .. Word_LB; Direction at 1 * Word_Bytes range 0 .. Word_LB; Format at 2 * Word_Bytes range 0 .. Word_LB; Width at 3 * Word_Bytes range 0 .. Word_LB; Height at 4 * Word_Bytes range 0 .. Word_LB; Ascent at 5 * Word_Bytes range 0 .. Word_LB; Descent at 6 * Word_Bytes range 0 .. Word_LB; Num_Glyphs at 7 * Word_Bytes range 0 .. Word_LB; end record; procedure Read_Header is new Read (Txf_Header); -- Texture glyph info, used to build the vertex table type Txf_Glyph_Info is record Glyph : Short; Width : Byte; Height : Byte; X_Offset : S_Byte; Y_Offset : S_Byte; Advance : S_Byte; X : S_Short; Y : S_Short; end record; for Txf_Glyph_Info use record Glyph at 0 range 0 .. Short_LB; Width at 2 range 0 .. Byte_LB; Height at 3 range 0 .. Byte_LB; X_Offset at 4 range 0 .. Byte_LB; Y_Offset at 5 range 0 .. Byte_LB; Advance at 6 range 0 .. Byte_LB; X at 8 range 0 .. Short_LB; Y at 10 range 0 .. Short_LB; end record; type Txf_Glyph_Info_Array is array (Positive range <>) of Txf_Glyph_Info; -- Operating variables File : IO.File_Type; Header : Txf_Header; Swap : Boolean := False; -- assume the best begin -- Load -- Slurp in the file's header IO.Open (File, Pathname); Read_Header (File, Header); -- Verify that it's got the txf signature if Header.Signature /= Txf_Signature_Mark then IO.Close (File); raise Unknown_Format with "missing txf signature"; end if; -- Check the byte ordering if Header.Direction /= Txf_Endian_Mark then -- It must be one or the other if Wrds.Swap_Bytes (Header.Direction) = Txf_Endian_Mark then Swap := True; -- Go ahead and swap the header while we're here Wrds.Swap_Bytes (Header.Format); Ints.Swap_Bytes (Header.Width); Ints.Swap_Bytes (Header.Height); Ints.Swap_Bytes (Header.Ascent); Ints.Swap_Bytes (Header.Descent); Ints.Swap_Bytes (Header.Num_Glyphs); else -- Nothing we can recognize IO.Close (File); raise Unknown_Format with "unrecognized byte-order marker"; end if; end if; -- Reject bitmapped texture-font files for now if Header.Format /= Txf_Byte_Format then IO.Close (File); raise Invalid_Format with "bitmap format not yet supported"; end if; -- Now we know the size of the texture glyph info table, so read it in -- and use it to create the vertex table, which is what we actually use -- to draw the glyphs declare subtype Txf_Info_Table is Txf_Glyph_Info_Array (1 .. Header.Num_Glyphs); procedure Read_Txf_Info is new Read (Txf_Info_Table); package USht is new Lumen.Binary.Endian.Shorts (Short); package SSht is new Lumen.Binary.Endian.Shorts (S_Short); Info : Txf_Info_Table; Lo_Glyph : Natural; Hi_Glyph : Natural; W : constant Float := Float (Header.Width); H : constant Float := Float (Header.Height); X_Step : constant Float := 0.5 / W; Y_Step : constant Float := 0.5 / H; T : Txf_Glyph_Info; Verts : Txf_Vertex_Info; begin -- Read the data from the file Read_Txf_Info (File, Info); -- Ensure correct byte ordering of the multi-byte fields if Swap then for I in Info'Range loop USht.Swap_Bytes (Info (I).Glyph); SSht.Swap_Bytes (Info (I).X); SSht.Swap_Bytes (Info (I).Y); end loop; end if; -- Find glyph bounds Lo_Glyph := Natural (Info (Info'First).Glyph); Hi_Glyph := Natural (Info (Info'First).Glyph); for I in Info'Range loop Lo_Glyph := Natural'Min (Lo_Glyph, Natural (Info (I).Glyph)); Hi_Glyph := Natural'Max (Hi_Glyph, Natural (Info (I).Glyph)); end loop; -- Create our return value object Font.Info := new Font_Info (Glyphs => Header.Num_Glyphs, Size => Header.Width * Header.Height, Lo => Lo_Glyph, Hi => Hi_Glyph); Font.Info.Width := Header.Width; Font.Info.Height := Header.Height; Font.Info.Ascent := Header.Ascent; Font.Info.Descent := Header.Descent; Font.Info.Num_Glyphs := Header.Num_Glyphs; -- Finish reading the file so we can close it Font.Info.Image := IO.Read (File, Font.Info.Size); IO.Close (File); -- Build the texture vertex table for I in Info'Range loop T := Info (I); Verts.Glyph := Natural (T.Glyph); Verts.T (1) (1) := Float (T.X) / W + X_Step; Verts.T (1) (2) := Float (T.Y) / H + Y_Step; Verts.V (1) (1) := GL.Short (T.X_Offset); Verts.V (1) (2) := GL.Short (T.Y_Offset); Verts.T (2) (1) := Float (T.X + S_Short (T.Width)) / W + X_Step; Verts.T (2) (2) := Float (T.Y) / H + Y_Step; Verts.V (2) (1) := GL.Short (T.X_Offset + S_Byte (T.Width)); Verts.V (2) (2) := GL.Short (T.Y_Offset); Verts.T (3) (1) := Float (T.X + S_Short (T.Width)) / W + X_Step; Verts.T (3) (2) := Float (T.Y + S_Short (T.Height)) / H + Y_Step; Verts.V (3) (1) := GL.Short (T.X_Offset + S_Byte (T.Width)); Verts.V (3) (2) := GL.Short (T.Y_Offset + S_Byte (T.Height)); Verts.T (4) (1) := Float (T.X) / W + X_Step; Verts.T (4) (2) := Float (T.Y + S_Short (T.Height)) / H + Y_Step; Verts.V (4) (1) := GL.Short (T.X_Offset); Verts.V (4) (2) := GL.Short (T.Y_Offset + S_Byte (T.Height)); Verts.Ascent := Integer'Max (0, Integer (T.Y_Offset) + Integer (T.Height)); Verts.Descent := Integer'Min (0, Integer (T.Y_Offset)); Verts.Advance := Float (T.Advance); Font.Info.Verts (I) := Verts; end loop; -- Generate the glyph lookup table Font.Info.Lookup := (others => 0); -- none allocated yet for I in Font.Info.Verts'Range loop Font.Info.Lookup (Font.Info.Verts (I).Glyph) := I; end loop; end; end Load; --------------------------------------------------------------------------- -- Unload a texture font procedure Unload (Font : in out Handle) is procedure Free is new Ada.Unchecked_Deallocation (Font_Info, Font_Info_Pointer); begin -- Unload if Font.Info /= null then Free (Font.Info); Font.Info := null; -- shouldn't be necessary, but oh well end if; end Unload; --------------------------------------------------------------------------- -- Set up an OpenGL texture object. If Object is zero, create a new object -- to use for the font's texture. function Establish_Texture (Font : in Handle; Object : in GL.UInt; Setup_Mipmaps : in Boolean) return GL.UInt is use type GL.UInt; Status : GL.Int; begin -- Establish_Texture -- Either use given texture object, or ask GL to generate a new one if Font.Info.Object = 0 then if Object = 0 then GL.Gen_Textures (1, Font.Info.Object'Address); else Font.Info.Object := Object; end if; end if; -- Bind the texture GL.Bind_Texture (GL.GL_TEXTURE_2D, Font.Info.Object); -- Now send the texture image to GL, either as a series of mipmaps, -- or just directly if Setup_Mipmaps then Status := GLU.Build_2D_Mipmaps (GL.GL_TEXTURE_2D, GL.Int (GL.GL_INTENSITY4), Font.Info.Width, Font.Info.Height, GL.GL_LUMINANCE, GL.GL_UNSIGNED_BYTE, Font.Info.Image'Address); else GL.Tex_Image (GL.GL_TEXTURE_2D, 0, GL.GL_INTENSITY4, Font.Info.Width, Font.Info.Height, 0, GL.GL_LUMINANCE, GL.GL_UNSIGNED_BYTE, Font.Info.Image'Address); end if; -- Return the texture object's name return Font.Info.Object; end Establish_Texture; --------------------------------------------------------------------------- -- Bind the font's texture to an OpenGL texture object procedure Bind_Font_Texture (Font : in Handle) is begin -- Bind_Font_Texture GL.Bind_Texture (GL.GL_TEXTURE_2D, Font.Info.Object); end Bind_Font_Texture; --------------------------------------------------------------------------- -- Return dimensions of given string, to permit calculations for placing it -- in a scene procedure Get_String_Metrics (Font : in Handle; Str : in String; Width : out Natural; Max_Ascent : out Natural; Max_Descent : out Natural) is W : Natural := 0; V : Txf_Vertex_Info; MA : Natural; MD : Natural; begin -- Get_String_Metrics -- Scan the string a char at a time, accumulating glyph widths (well -- really, "advances") V := Get_Vertex_Info (Font, Character'Pos (Str (Str'First))); MA := abs V.Ascent; MD := abs V.Descent; for C in Str'Range loop V := Get_Vertex_Info (Font, Character'Pos (Str (C))); MA := Natural'Max (MA, abs V.Ascent); MD := Natural'Max (MD, abs V.Descent); W := W + Natural (V.Advance); end loop; -- Return results Width := W; Max_Ascent := MA; Max_Descent := MD; end Get_String_Metrics; --------------------------------------------------------------------------- -- Render a single character procedure Render (Font : in Handle; Char : in Character) is V : constant Txf_Vertex_Info := Get_Vertex_Info (Font, Character'Pos (Char)); begin -- Render GL.Begin_Primitive (GL.GL_QUADS); GL.Tex_Coord (V.T (1)); GL.Vertex (V.V (1)); GL.Tex_Coord (V.T (2)); GL.Vertex (V.V (2)); GL.Tex_Coord (V.T (3)); GL.Vertex (V.V (3)); GL.Tex_Coord (V.T (4)); GL.Vertex (V.V (4)); GL.End_Primitive; GL.Translate (V.Advance, 0.0, 0.0); end Render; --------------------------------------------------------------------------- -- Render a string of characters procedure Render (Font : in Handle; Str : in String) is begin -- Render for C in Str'Range loop Render (Font, Str (C)); end loop; end Render; --------------------------------------------------------------------------- end Lumen.Font.Txf;
reznikmm/matreshka
Ada
5,645
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Web API Definition -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2016, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ package WebAPI.DOM.Rect_Read_Onlys is pragma Preelaborate; type DOM_Rect_Read_Only is limited interface; type DOM_Rect_Read_Only_Access is access all DOM_Rect_Read_Only'Class with Storage_Size => 0; not overriding function Get_X (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "x"; not overriding function Get_Y (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "y"; not overriding function Get_Width (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "width"; not overriding function Get_Height (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "height"; not overriding function Get_Top (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "top"; not overriding function Get_Right (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "right"; not overriding function Get_Bottom (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "bottom"; not overriding function Get_Left (Self : not null access constant DOM_Rect_Read_Only) return DOM_Double is abstract with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "left"; end WebAPI.DOM.Rect_Read_Onlys;
reznikmm/matreshka
Ada
3,714
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Elements; package ODF.DOM.Db_Table_Filter_Pattern_Elements is pragma Preelaborate; type ODF_Db_Table_Filter_Pattern is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Db_Table_Filter_Pattern_Access is access all ODF_Db_Table_Filter_Pattern'Class with Storage_Size => 0; end ODF.DOM.Db_Table_Filter_Pattern_Elements;
reznikmm/matreshka
Ada
3,630
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Elements.Generic_Hash; function AMF.UML.Read_Extent_Actions.Hash is new AMF.Elements.Generic_Hash (UML_Read_Extent_Action, UML_Read_Extent_Action_Access);
onox/orka
Ada
15,874
adb
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2021 onox <[email protected]> -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. package body Orka.Numerics.Tensors is function Elements (Shape : Tensor_Shape) return Natural is Result : Natural := 1; begin for Elements of Shape loop Result := Result * Elements; end loop; return Result; end Elements; function Add (Left, Right : Tensor_Shape; Axis : Tensor_Axis) return Tensor_Shape is Result : Tensor_Shape := Left; begin Result (Axis) := Result (Axis) + Right (Axis); return Result; end Add; function To_Index (Index : Tensor_Index; Shape : Tensor_Shape) return Index_Type is Result : Index_Type := Index (Index'Last); Size : Natural := Shape (Index'Last); begin for Axis in reverse 1 .. Index'Last - 1 loop Result := (Index (Axis) - 1) * Size + Result; Size := Size * Shape (Axis); end loop; return Result; end To_Index; function Shape (Index : Tensor_Range) return Tensor_Shape is begin return Result : Tensor_Shape (Index'Range) do for Axis in Result'Range loop Result (Axis) := Index (Axis).Stop - Index (Axis).Start + 1; end loop; end return; end Shape; function Full_Range (Shape : Tensor_Shape; Index : Tensor_Range) return Tensor_Range is Result : Tensor_Range (Shape'Range); begin for Axis in Result'Range loop if Axis in Index'Range then Result (Axis) := Index (Axis); else Result (Axis) := (Start => 1, Stop => Shape (Axis)); end if; end loop; return Result; end Full_Range; function Full_Shape (Axes : Tensor_Axis; Shape : Tensor_Shape; Justify : Alignment) return Tensor_Shape is Result : Tensor_Shape (1 .. Axes) := (others => 1); Offset : constant Tensor_Axis'Base := (case Justify is when Left => 0, when Right => Result'Last - Shape'Last); begin for Axis in Shape'Range loop Result (Offset + Axis) := Shape (Axis); end loop; return Result; end Full_Shape; function Trim (Value : Natural) return String is Result : constant String := Value'Image; begin return Result (Result'First + 1 .. Result'Last); end Trim; function Image (Shape : Tensor_Shape) return String is (case Shape'Length is when 1 => "(" & Trim (Shape (1)) & ")", when 2 => "(" & Trim (Shape (1)) & ", " & Trim (Shape (2)) & ")", when others => raise Program_Error); function Image (Index : Tensor_Index) return String is (case Index'Length is when 1 => "(" & Trim (Index (1)) & ")", when 2 => "(" & Trim (Index (1)) & ", " & Trim (Index (2)) & ")", when others => raise Program_Error); ---------------------------------------------------------------------------- package body Generic_Random is -- Box-Muller method for the standard normal distribution -- -- Alternatively, (U_1 + ... + U_12) - 6.0 uses the central limit -- theorem to approximate the standard normal distribution with -- samples limited to (-6, 6). 0.00034 % of the actual standard normal -- distribution falls outside this range. function Normal (Shape : Tensor_Shape) return Random_Tensor is (Multiply (Sqrt (-2.0 * Log (Uniform (Shape) + Element'Model_Small)), Cos ((2.0 * Ada.Numerics.Pi) * Uniform (Shape)))); function Binomial (Shape : Tensor_Shape; N : Positive; P : Probability) return Random_Tensor is Result : Random_Tensor := Zeros (Shape); begin for Index in 1 .. N loop Result := Result + (1.0 and (Uniform (Shape) <= Element (P))); end loop; return Result; end Binomial; function Geometric (Shape : Tensor_Shape; P : Probability) return Random_Tensor is (Floor (Exponential (Shape, -EF.Log (Element (1.0 - P) + Element'Model_Small)))); function Poisson (Shape : Tensor_Shape; Lambda : Element) return Random_Tensor is U : constant Random_Tensor := Uniform (Shape); use EF; I : Random_Tensor := Zeros (Shape); Expr : Random_Tensor := Fill (Shape, Ada.Numerics.e ** (-Lambda)); Sum : Random_Tensor := Expr; begin loop declare Loop_Condition : constant Random_Tensor := U > Sum; begin exit when not Any_True (Loop_Condition); -- Using inverse transform sampling (with y is lambda): -- P = min{p = 0, 1, 2, ... | U <= exp(-y) * Sum (y^i / i! for i in 0 .. p)} I := I + (1.0 and Loop_Condition); Expr := Expr * Lambda / I; Sum := Sum + (Expr and Loop_Condition); end; end loop; return I; end Poisson; function Gamma (Shape : Tensor_Shape; K, Theta : Element) return Random_Tensor is D : constant Element := K - 1.0 / 3.0; C : constant Element := 1.0 / EF.Sqrt (9.0 * D); Result : Random_Tensor := Zeros (Shape); Fraction : Random_Tensor := Zeros (Shape); begin for I in 1 .. Integer (Element'Floor (K)) loop Result := Result + Log (Uniform (Shape) + Element'Model_Small); Result.Materialize; end loop; -- Marsaglia's transformation-rejection method [1] -- -- [1] "A Simple Method for Generating Gamma Variables", Marsaglia G., Tsang W., -- ACM Trans. Math. Softw., 26.3:363−372, 2000 -- -- See https://en.wikipedia.org/wiki/Gamma_distribution declare Loop_Condition : Random_Tensor := Fraction /= Fraction; begin loop declare X : constant Random_Tensor := Normal (Shape); U : constant Random_Tensor := Log (Uniform (Shape) + Element'Model_Small); V : constant Random_Tensor := Power (1.0 + C * X, 3); DV : constant Random_Tensor := D * V; -- (Check that -1.0 / C < X, otherwise Log (V) will fail because V <= 0.0) If_Condition : constant Random_Tensor := V > 0.0 and -1.0 / C < X and U < 0.5 * Power (X, 2) + D - DV + D * Log (Max (0.0, V) + Element'Model_Small); begin -- Update Fraction with value DV but not if the element was already true before Fraction := Fraction + DV and And_Not (Loop_Condition, If_Condition); Loop_Condition := Loop_Condition or If_Condition; exit when All_True (Loop_Condition); end; end loop; end; return Theta * (Fraction - Result); end Gamma; -- Beta (Alpha, Beta) = X / (X + Y) where X ~ Gamma(Alpha, Theta) and Y ~ Gamma(Beta, Theta) function Beta (Shape : Tensor_Shape; Alpha, Beta : Element) return Random_Tensor is X : constant Random_Tensor := Gamma (Shape, Alpha, 1.0); Y : constant Random_Tensor := Gamma (Shape, Beta, 1.0); begin return X / (X + Y); end Beta; function Test_Statistic_T_Test (Data : Random_Tensor; True_Mean : Element) return Element is Sample_Mean : constant Element := Data.Mean; Sample_Std : constant Element := Data.Standard_Deviation (Offset => 1); begin return (Sample_Mean - True_Mean) / (Sample_Std / EF.Sqrt (Element (Data.Elements))); end Test_Statistic_T_Test; function Threshold_T_Test (Data : Random_Tensor; Level : Probability) return Element is Sample_Std : constant Element := Data.Standard_Deviation (Offset => 1); use EF; -- Simple approximation by Shore (1982) -- T_Value : constant Element := 5.5556 * (1.0 - Element (Level / (1.0 - Level))**0.1186); -- "A handy approximation for the error function and its inverse", Winitzki S., 2008, -- equation 7. function Inverse_Erf (X : Probability) return Element is A : constant := 0.147; Two_Pi_A : constant := 2.0 / (Ada.Numerics.Pi * A); Ln_X2 : constant Element := Log (1.0 - Element (X)**2); Two_Pi_A_Ln_X2 : constant Element := Two_Pi_A + Ln_X2 / 2.0; begin return Sqrt (Sqrt (Two_Pi_A_Ln_X2**2 - Ln_X2 / A) - Two_Pi_A_Ln_X2); end Inverse_Erf; -- Quantile function of standard normal distribution T_Value : constant Element := Sqrt (2.0) * Inverse_Erf (2.0 * (1.0 - Level) - 1.0); begin return T_Value * (Sample_Std / EF.Sqrt (Element (Data.Elements))); end Threshold_T_Test; end Generic_Random; ---------------------------------------------------------------------------- -- Expressions -- ---------------------------------------------------------------------------- overriding function "+" (Left, Right : Expression_Type) return Expression_Type is (Kind => Binary_Operation, Operator => Add, Left => Expression_Holders.To_Holder (Left), Right => Expression_Holders.To_Holder (Right)); overriding function "-" (Left, Right : Expression_Type) return Expression_Type is (Kind => Binary_Operation, Operator => Subtract, Left => Expression_Holders.To_Holder (Left), Right => Expression_Holders.To_Holder (Right)); overriding function "*" (Left, Right : Expression_Type) return Expression_Type is (Kind => Binary_Operation, Operator => Multiply, Left => Expression_Holders.To_Holder (Left), Right => Expression_Holders.To_Holder (Right)); overriding function "/" (Left, Right : Expression_Type) return Expression_Type is (Kind => Binary_Operation, Operator => Divide, Left => Expression_Holders.To_Holder (Left), Right => Expression_Holders.To_Holder (Right)); overriding function Min (Left, Right : Expression_Type) return Expression_Type is (Kind => Binary_Operation, Operator => Min, Left => Expression_Holders.To_Holder (Left), Right => Expression_Holders.To_Holder (Right)); overriding function Max (Left, Right : Expression_Type) return Expression_Type is (Kind => Binary_Operation, Operator => Max, Left => Expression_Holders.To_Holder (Left), Right => Expression_Holders.To_Holder (Right)); overriding function "-" (Value : Expression_Type) return Expression_Type is (Kind => Unary_Operation, Unary_Operator => Minus, Expression => Expression_Holders.To_Holder (Value)); overriding function "abs" (Value : Expression_Type) return Expression_Type is (Kind => Unary_Operation, Unary_Operator => Absolute, Expression => Expression_Holders.To_Holder (Value)); overriding function Sqrt (Value : Expression_Type) return Expression_Type is (Kind => Unary_Operation, Unary_Operator => Sqrt, Expression => Expression_Holders.To_Holder (Value)); overriding function X return Expression_Type is (Kind => Argument, Argument => X); overriding function Y return Expression_Type is (Kind => Argument, Argument => Y); overriding function Number (Value : Element) return Expression_Type is (Kind => Number, Number => Value); overriding function "+" (Left : Element; Right : Expression_Type) return Expression_Type is (Number (Left) + Right); overriding function "+" (Left : Expression_Type; Right : Element) return Expression_Type is (Left + Number (Right)); overriding function "-" (Left : Element; Right : Expression_Type) return Expression_Type is (Number (Left) - Right); overriding function "-" (Left : Expression_Type; Right : Element) return Expression_Type is (Left - Number (Right)); overriding function "*" (Left : Element; Right : Expression_Type) return Expression_Type is (Number (Left) * Right); overriding function "*" (Left : Expression_Type; Right : Element) return Expression_Type is (Left * Number (Right)); overriding function "/" (Left : Element; Right : Expression_Type) return Expression_Type is (Number (Left) / Right); overriding function "/" (Left : Expression_Type; Right : Element) return Expression_Type is (Left / Number (Right)); overriding function Min (Left : Element; Right : Expression_Type) return Expression_Type is (Min (Number (Left), Right)); overriding function Min (Left : Expression_Type; Right : Element) return Expression_Type is (Min (Left, Number (Right))); overriding function Max (Left : Element; Right : Expression_Type) return Expression_Type is (Max (Number (Left), Right)); overriding function Max (Left : Expression_Type; Right : Element) return Expression_Type is (Max (Left, Number (Right))); function Generic_Apply (Object : Expression_Type; Left, Right : Data_Type) return Data_Type is begin case Object.Kind is when Argument => case Object.Argument is when X => return Left; when Y => return Right; end case; when Number => return Identity (Object.Number); when Binary_Operation => declare Result_Left : constant Data_Type := Generic_Apply (Expression_Type (Object.Left.Element), Left, Right); Result_Right : constant Data_Type := Generic_Apply (Expression_Type (Object.Right.Element), Left, Right); begin case Object.Operator is when Add => return Result_Left + Result_Right; when Subtract => return Result_Left - Result_Right; when Multiply => return Result_Left * Result_Right; when Divide => return Result_Left / Result_Right; when Min => return Min (Result_Left, Result_Right); when Max => return Max (Result_Left, Result_Right); end case; end; when Unary_Operation => declare Result : constant Data_Type := Generic_Apply (Expression_Type (Object.Expression.Element), Left, Right); begin case Object.Unary_Operator is when Minus => return -Result; when Absolute => return abs Result; when Sqrt => return Sqrt (Result); end case; end; end case; end Generic_Apply; end Orka.Numerics.Tensors;
charlie5/lace
Ada
41,624
adb
with GL.Binding, GL.lean, Interfaces.c.Pointers, ada.unchecked_Conversion, ada.unchecked_Deallocation; package body GLU -- -- This is a direct port of parts of Mesa GLU 'mipmap.c' file. -- -- Only declarations involved in 'gluScaleImage' are currently ported. -- Other areas may be later ported at need. -- -- Currently supports only GL datatypes allowed in the 'lean' profile. -- is use GL.lean, Interfaces; use type GLint, GLenum, GLfloat; -- GLubyte -- type GLubtye_array is array (C.size_t range <>) of aliased GLubyte; package GLubyte_Pointers is new C.Pointers (Index => C.size_t, Element => GLubyte, Element_Array => GLubtye_array, Default_Terminator => 0); subtype GLubyte_view is GLubyte_Pointers.Pointer; function to_GLubyte_view is new ada.unchecked_Conversion (system.Address, GLubyte_view); -- GLushort -- package GLushort_Pointers is new C.Pointers (Index => C.size_t, Element => GLushort, Element_Array => GLushort_array, Default_Terminator => 0); subtype GLushort_view is GLushort_Pointers.Pointer; function to_GLushort_view is new ada.unchecked_Conversion (system.Address, GLushort_view); function to_GLushort_view is new ada.unchecked_Conversion (GLubyte_view, GLushort_view); type GLushort_array_view is access all GLushort_array; -- GLbyte -- type GLbyte_view is access all GLbyte; function to_GLbyte_view is new ada.unchecked_Conversion (GLubyte_view, GLbyte_view); -- Pixel storage modes -- type PixelStorageModes is record pack_alignment, pack_row_length, pack_skip_rows, pack_skip_pixels, pack_lsb_first, pack_swap_bytes, pack_skip_images, pack_image_height, unpack_alignment, unpack_row_length, unpack_skip_rows, unpack_skip_pixels, unpack_lsb_first, unpack_swap_bytes, unpack_skip_images, unpack_image_height : aliased GLint; end record; -- Type_Widget -- type widget_Kind is (ub, us, ui, b, s, i, f); type uchar_array is array (C.size_t range <>) of C.unsigned_char; type char_array is array (C.size_t range <>) of C.char; type short_array is array (C.size_t range <>) of C.short; type Type_Widget (Kind : widget_Kind := widget_Kind'First) is record case Kind is when ub => ub : uchar_array (0 .. 3); when us => us : GLushort_array (0 .. 1); when ui => ui : c.unsigned; when b => b : char_array (0 .. 3); when s => s : short_array (0 .. 1); when i => i : C.int; when f => f : GLfloat; end case; end record; pragma Unchecked_Union (Type_Widget); function legalFormat (Format : in GLenum) return Boolean is begin case Format is when GL_ALPHA | GL_RGB | GL_RGBA | GL_LUMINANCE | GL_LUMINANCE_ALPHA => return True; when others => return False; end case; end legalFormat; function legalType (gl_Type : in GLenum) return Boolean is begin case gl_Type is when GL_BYTE | GL_UNSIGNED_BYTE | GL_SHORT | GL_UNSIGNED_SHORT | GL_INT | GL_UNSIGNED_INT | GL_FLOAT | GL_UNSIGNED_SHORT_5_6_5 | GL_UNSIGNED_SHORT_4_4_4_4 | GL_UNSIGNED_SHORT_5_5_5_1 => return True; when others => return False; end case; end legalType; function isTypePackedPixel (gl_Type : in GLenum) return Boolean is pragma assert (legalType (gl_Type)); begin case gl_Type is when GL_UNSIGNED_SHORT_5_6_5 | GL_UNSIGNED_SHORT_4_4_4_4 | GL_UNSIGNED_SHORT_5_5_5_1 => return True; when others => return False; end case; end isTypePackedPixel; -- Determines if the packed pixel type is compatible with the format. -- function isLegalFormatForPackedPixelType (format, gl_Type : in GLenum) return Boolean is begin -- If not a packed pixel type then return true. -- if not isTypePackedPixel (gl_Type) then return True; end if; -- 3_3_2/2_3_3_REV & 5_6_5/5_6_5_REV are only compatible with RGB -- if gl_Type = GL_UNSIGNED_SHORT_5_6_5 and format /= GL_RGB then return False; end if; -- 4_4_4_4 & 5_5_5_1 are only compatible with RGBA. -- if ( gl_Type = GL_UNSIGNED_SHORT_4_4_4_4 or gl_Type = GL_UNSIGNED_SHORT_5_5_5_1) and format /= GL_RGBA then return False; end if; return True; end isLegalFormatForPackedPixelType; -- Return the number of bytes per element, based on the element type. -- function bytes_per_element (gl_Type : in GLenum) return GLfloat is begin case gl_Type is when GL_UNSIGNED_SHORT => return GLfloat (GLushort'Size / 8); when GL_SHORT => return GLfloat (GLshort 'Size / 8); when GL_UNSIGNED_BYTE => return GLfloat (GLubyte 'Size / 8); when GL_BYTE => return GLfloat (GLbyte 'Size / 8); when GL_INT => return GLfloat (GLint 'Size / 8); when GL_UNSIGNED_INT => return GLfloat (GLuint 'Size / 8); when GL_FLOAT => return GLfloat (GLfloat 'Size / 8); when GL_UNSIGNED_SHORT_5_6_5 | GL_UNSIGNED_SHORT_4_4_4_4 | GL_UNSIGNED_SHORT_5_5_5_1 => return GLfloat (GLushort'Size / 8); when others => return 4.0; end case; end bytes_per_element; -- Return the number of elements per group of a specified format. -- function elements_per_group (format, gl_Type : in GLenum) return GLint is begin -- If the type is packedpixels then answer is 1 (ignore format). -- if gl_Type = GL_UNSIGNED_SHORT_5_6_5 or gl_Type = GL_UNSIGNED_SHORT_4_4_4_4 or gl_Type = GL_UNSIGNED_SHORT_5_5_5_1 then return 1; end if; -- Types are not packed pixels, so get elements per group. -- case format is when GL_RGB => return 3; when GL_LUMINANCE_ALPHA => return 2; when GL_RGBA => return 4; when others => return 1; end case; end elements_per_group; -- Compute memory required for internal packed array of data of given type and format. -- function image_size (width, height : in GLint; format, gl_Type : in GLenum) return c.size_t is pragma assert (width > 0); pragma assert (height > 0); bytes_per_row : constant GLint := GLint (bytes_per_element (gl_Type)) * width; components : constant GLint := elements_per_group (format, gl_Type); begin return c.size_t (bytes_per_row * height * components); end image_size; procedure retrieveStoreModes (psm : in out PixelStorageModes) is use gl.Binding; begin glGetIntegerv (GL_UNPACK_ALIGNMENT, psm.unpack_alignment'Access); psm.unpack_row_length := 0; psm.unpack_skip_rows := 0; psm.unpack_skip_pixels := 0; psm.unpack_lsb_first := 0; psm.unpack_swap_bytes := 0; glGetIntegerv (GL_PACK_ALIGNMENT, psm.pack_alignment'Access); psm.pack_row_length := 0; psm.pack_skip_rows := 0; psm.pack_skip_pixels := 0; psm.pack_lsb_first := 0; psm.pack_swap_bytes := 0; end retrieveStoreModes; function GLU_SWAP_2_BYTES (s : in system.Address) return GLushort is use GLubyte_Pointers; s0 : constant GLubyte_view := to_GLubyte_view (s) + 0; s1 : constant GLubyte_view := to_GLubyte_view (s) + 1; begin return GLushort ( shift_Left (Unsigned_16 (s1.all), 8) or Unsigned_16 (s0.all)); end GLU_SWAP_2_BYTES; -- #define __GLU_SWAP_2_BYTES(s)\ -- (GLushort) ( ((GLushort) ((const GLubyte*) (s)) [1]) << 8 | ((const GLubyte*) (s)) [0] ) function GLU_SWAP_4_BYTES (s : in system.Address) return GLushort is use GLubyte_Pointers; s0 : constant GLubyte_view := to_GLubyte_view (s) + 0; s1 : constant GLubyte_view := to_GLubyte_view (s) + 1; s2 : constant GLubyte_view := to_GLubyte_view (s) + 2; s3 : constant GLubyte_view := to_GLubyte_view (s) + 3; begin return GLushort ( shift_Left (Unsigned_32 (s3.all), 24) or shift_Left (Unsigned_32 (s2.all), 16) or shift_Left (Unsigned_32 (s1.all), 8) or Unsigned_32 (s0.all)); end GLU_SWAP_4_BYTES; -- #define __GLU_SWAP_4_BYTES(s)\ -- (GLuint)(((GLuint)((const GLubyte*)(s))[3])<<24 | \ -- ((GLuint)((const GLubyte*)(s))[2])<<16 | \ -- ((GLuint)((const GLubyte*)(s))[1])<<8 | -- ((const GLubyte*)(s))[0]) procedure extract565 (isSwap : in GLint; packedPixel : in system.Address; extractComponents : out GLfloat_array) is use type GLushort; ushort : GLushort; begin if isSwap /= 0 then ushort := GLU_SWAP_2_BYTES (packedPixel); else ushort := to_GLushort_view (packedPixel).all; end if; -- 11111000,00000000 == 0xf800 -- 00000111,11100000 == 0x07e0 -- 00000000,00011111 == 0x001f -- extractComponents (0) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#f800#), 11)) / 31.0; -- 31 = 2^5-1 extractComponents (1) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#07e0#), 5)) / 63.0; -- 63 = 2^6-1 extractComponents (2) := GLfloat ( ushort and 16#001f#) / 31.0; end extract565; procedure extract4444 (isSwap : in GLint; packedPixel : in system.Address; extractComponents : out GLfloat_array) is use type GLushort; ushort : GLushort; begin if isSwap /= 0 then ushort := GLU_SWAP_2_BYTES (packedPixel); else ushort := to_GLushort_view (packedPixel).all; end if; -- 11110000,00000000 == 0xf000 -- 00001111,00000000 == 0x0f00 -- 00000000,11110000 == 0x00f0 -- 00000000,00001111 == 0x000f -- extractComponents (0) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#f000#), 12)) / 15.0; -- 15 = 2^4-1 extractComponents (1) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#0f00#), 8)) / 15.0; extractComponents (2) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#00f0#), 4)) / 15.0; extractComponents (3) := GLfloat ( ushort and 16#000f#) / 15.0; end extract4444; procedure extract5551 (isSwap : in GLint; packedPixel : in system.Address; extractComponents : out GLfloat_array) is use type GLushort; ushort : GLushort; begin if isSwap /= 0 then ushort := GLU_SWAP_2_BYTES (packedPixel); else ushort := to_GLushort_view (packedPixel).all; end if; -- 11111000,00000000 == 0xf800 -- 00000111,11000000 == 0x07c0 -- 00000000,00111110 == 0x003e -- 00000000,00000001 == 0x0001 -- extractComponents (0) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#f800#), 11)) / 31.0; -- 31 = 2^5-1 extractComponents (1) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#07c0#), 6)) / 31.0; extractComponents (2) := GLfloat (shift_Right (Unsigned_16 (ushort and 16#003e#), 1)) / 31.0; extractComponents (3) := GLfloat ( ushort and 16#0001#); end extract5551; procedure shove565 (shoveComponents : in GLfloat_array; index : in GLint; packedPixel : in system.Address) is use GLushort_Pointers; use type GLushort; the_Pixel : constant GLushort_view := to_GLushort_view (packedPixel) + C.ptrdiff_t (index); begin -- 11111000,00000000 == 0xf800 -- 00000111,11100000 == 0x07e0 -- 00000000,00011111 == 0x001f pragma assert (0.0 <= shoveComponents(0) and shoveComponents(0) <= 1.0); pragma assert (0.0 <= shoveComponents(1) and shoveComponents(1) <= 1.0); pragma assert (0.0 <= shoveComponents(2) and shoveComponents(2) <= 1.0); -- due to limited precision, need to round before shoving -- the_Pixel.all := GLushort (shift_Left (Unsigned_16 (shoveComponents (0) * 31.0 + 0.5), 11) and 16#f800#); the_Pixel.all := the_Pixel.all or GLushort (shift_Left (Unsigned_16 (shoveComponents (1) * 63.0 + 0.5), 5) and 16#07e0#); the_Pixel.all := the_Pixel.all or GLushort ( Unsigned_16 (shoveComponents (2) * 31.0 + 0.5) and 16#001f#); end shove565; procedure shove4444 (shoveComponents : in GLfloat_array; index : in GLint; packedPixel : in system.Address) is use GLushort_Pointers; use type GLushort; the_Pixel : constant GLushort_view := to_GLushort_view (packedPixel) + C.ptrdiff_t (index); begin pragma assert (0.0 <= shoveComponents (0) and shoveComponents (0) <= 1.0); pragma assert (0.0 <= shoveComponents (1) and shoveComponents (1) <= 1.0); pragma assert (0.0 <= shoveComponents (2) and shoveComponents (2) <= 1.0); pragma assert (0.0 <= shoveComponents (3) and shoveComponents (3) <= 1.0); -- due to limited precision, need to round before shoving -- the_Pixel.all := GLushort (shift_Left (Unsigned_16 (shoveComponents (0) * 15.0 + 0.5), 12) and 16#f000#); the_Pixel.all := the_Pixel.all or GLushort (shift_Left (Unsigned_16 (shoveComponents (1) * 15.0 + 0.5), 8) and 16#0f00#); the_Pixel.all := the_Pixel.all or GLushort (shift_Left (Unsigned_16 (shoveComponents (2) * 15.0 + 0.5), 4) and 16#00f0#); the_Pixel.all := the_Pixel.all or GLushort ( Unsigned_16 (shoveComponents (3) * 15.0 + 0.5) and 16#000f#); end shove4444; procedure shove5551 (shoveComponents : in GLfloat_array; index : in GLint; packedPixel : in system.Address) is use GLushort_Pointers; use type GLushort; the_Pixel : constant GLushort_view := to_GLushort_view (packedPixel) + C.ptrdiff_t (index); begin -- 11111000,00000000 == 0xf800 -- 00000111,11000000 == 0x07c0 -- 00000000,00111110 == 0x003e -- 00000000,00000001 == 0x0001 pragma assert (0.0 <= shoveComponents (0) and shoveComponents (0) <= 1.0); pragma assert (0.0 <= shoveComponents (1) and shoveComponents (1) <= 1.0); pragma assert (0.0 <= shoveComponents (2) and shoveComponents (2) <= 1.0); pragma assert (0.0 <= shoveComponents (3) and shoveComponents (3) <= 1.0); -- due to limited precision, need to round before shoving -- the_Pixel.all := GLushort (shift_Left (Unsigned_16 (shoveComponents (0) * 31.0 + 0.5), 11) and 16#f800#); the_Pixel.all := the_Pixel.all or GLushort (shift_Left (Unsigned_16 (shoveComponents (1) * 31.0 + 0.5), 6) and 16#07c0#); the_Pixel.all := the_Pixel.all or GLushort (shift_Left (Unsigned_16 (shoveComponents (2) * 31.0 + 0.5), 1) and 16#003e#); the_Pixel.all := the_Pixel.all or GLushort ( Unsigned_16 (shoveComponents (3) + 0.5) and 16#0001#); end shove5551; -- Extract array from user's data applying all pixel store modes. -- The internal format used is an array of unsigned shorts. -- procedure fill_image (psm : in PixelStorageModes; width, height : in GLint; format : in GLenum; gl_Type : in GLenum; index_format : in Boolean; userdata : in System.Address; newimage : in GLushort_array_view) is use GLubyte_Pointers, GLushort_Pointers; use type GLushort; components, element_size, rowsize, padding, groups_per_line, group_size, elements_per_line : GLint; start : GLubyte_view; iter : GLubyte_view; iter2 : GLushort_view; myswap_bytes : GLint; function to_GLubyte_view is new ada.Unchecked_Conversion (System.Address, GLubyte_view); begin myswap_bytes := psm.unpack_swap_bytes; components := elements_per_group (format, gl_Type); if psm.unpack_row_length > 0 then groups_per_line := psm.unpack_row_length; else groups_per_line := width; end if; element_size := GLint (bytes_per_element (gl_Type)); group_size := element_size * components; if element_size = 1 then myswap_bytes := 0; end if; rowsize := groups_per_line * group_size; padding := rowsize mod psm.unpack_alignment; if padding /= 0 then rowsize := rowsize + psm.unpack_alignment - padding; end if; -- start := (const GLubyte *) userdata + psm->unpack_skip_rows * rowsize start := to_GLubyte_view (userdata) + C.ptrdiff_t ( psm.unpack_skip_rows * rowsize + psm.unpack_skip_pixels * group_size); elements_per_line := width * components; iter2 := newimage (newimage'First)'Access; for i in 0 .. height - 1 loop iter := start; for j in 0 .. elements_per_line - 1 loop declare widget : Type_Widget; extractComponents : GLfloat_array (0 .. 3); begin case gl_Type is when GL_UNSIGNED_BYTE => if index_format then iter2.all := GLushort (iter.all); iter2 := iter2 + 1; else iter2.all := GLushort (iter.all) * 257; iter2 := iter2 + 1; end if; when GL_BYTE => if index_format then iter2.all := GLushort (to_GLbyte_view (iter).all); iter2 := iter2 + 1; else -- rough approx iter2.all := GLushort (to_GLbyte_view (iter).all) * 516; iter2 := iter2 + 1; end if; when GL_UNSIGNED_SHORT_5_6_5 => extract565 (myswap_bytes, iter.all'Address, extractComponents); for k in C.size_t' (0) .. 2 loop iter2.all := GLushort (extractComponents (k) * 65535.0); iter2 := iter2 + 1; end loop; when GL_UNSIGNED_SHORT_4_4_4_4 => extract4444 (myswap_bytes, iter.all'Address, extractComponents); for k in C.size_t' (0) .. 3 loop iter2.all := GLushort (extractComponents (k) * 65535.0); iter2 := iter2 + 1; end loop; when GL_UNSIGNED_SHORT_5_5_5_1 => extract5551 (myswap_bytes, iter.all'Address, extractComponents); for k in C.size_t' (0) .. 3 loop iter2.all := GLushort (extractComponents (k) * 65535.0); iter2 := iter2 + 1; end loop; when GL_UNSIGNED_SHORT | GL_SHORT => if myswap_bytes /= 0 then widget.ub (0) := GLubyte_view (iter + 1).all; widget.ub (1) := GLubyte_view (iter + 0).all; else widget.ub (0) := GLubyte_view (iter + 0).all; widget.ub (1) := GLubyte_view (iter + 1).all; end if; if gl_Type = GL_SHORT then if index_format then iter2.all := GLushort (widget.s (0)); iter2 := iter2 + 1; else -- rough approx iter2.all := GLushort (widget.s(0)) * 2; iter2 := iter2 + 1; end if; else iter2.all := widget.us (0); iter2 := iter2 + 1; end if; when GL_INT | GL_UNSIGNED_INT | GL_FLOAT => if myswap_bytes /= 0 then widget.ub(0) := GLubyte_view (iter + 3).all; widget.ub(1) := GLubyte_view (iter + 2).all; widget.ub(2) := GLubyte_view (iter + 1).all; widget.ub(3) := GLubyte_view (iter + 0).all; else widget.ub(0) := GLubyte_view (iter + 0).all; widget.ub(1) := GLubyte_view (iter + 1).all; widget.ub(2) := GLubyte_view (iter + 2).all; widget.ub(3) := GLubyte_view (iter + 3).all; end if; if gl_Type = GL_FLOAT then if index_format then iter2.all := GLushort (widget.f); iter2 := iter2 + 1; else iter2.all := GLushort (65535.0 * widget.f); iter2 := iter2 + 1; end if; elsif gl_Type = GL_UNSIGNED_INT then if index_format then iter2.all := GLushort (widget.ui); iter2 := iter2 + 1; else iter2.all := GLushort (shift_Right (Unsigned_32 (widget.ui), 16)); iter2 := iter2 + 1; end if; else if index_format then iter2.all := GLushort (widget.i); iter2 := iter2 + 1; else iter2.all := GLushort (shift_Right (Unsigned_32 (widget.i), 15)); iter2 := iter2 + 1; end if; end if; when others => raise GLU_INVALID_TYPE; end case; iter := iter + C.ptrdiff_t (element_size); end; end loop; -- for j start := start + C.ptrdiff_t (rowsize); -- want 'iter' pointing at start, not within, row for assertion purposes iter := start; end loop; -- for i -- iterators should be one byte past end -- if not isTypePackedPixel (gl_Type) then pragma assert (iter2 = newimage (C.size_t (width * height * components))'Access); else pragma assert (iter2 = newimage (C.size_t (width * height * elements_per_group (format, 0)))'Access); end if; pragma assert (iter = to_GLubyte_view (userdata) + C.ptrdiff_t ( rowsize * height + psm.unpack_skip_rows * rowsize + psm.unpack_skip_pixels * group_size)); end fill_image; -- Insert array into user's data applying all pixel store modes. -- The internal format is an array of unsigned shorts. -- empty_image() because it is the opposite of fill_image(). -- procedure empty_image (psm : in PixelStorageModes; width, height : in GLint; format : in GLenum; gl_Type : in GLenum; index_format : in Boolean; oldimage : in GLushort_array_view; userdata : in System.Address) is use GLubyte_Pointers, GLushort_Pointers; use type GLushort; components, element_size, rowsize, padding, groups_per_line, group_size, elements_per_line : GLint; start : GLubyte_view; iter : GLubyte_view; iter2 : GLushort_view; myswap_bytes : GLint; shoveComponents : GLfloat_array (0 .. 3); begin myswap_bytes := psm.pack_swap_bytes; components := elements_per_group (format, gl_Type); if psm.pack_row_length > 0 then groups_per_line := psm.pack_row_length; else groups_per_line := width; end if; element_size := GLint (bytes_per_element (gl_Type)); group_size := element_size * components; if element_size = 1 then myswap_bytes := 0; end if; rowsize := groups_per_line * group_size; padding := (rowsize mod psm.pack_alignment); if padding /= 0 then rowsize := rowsize + psm.pack_alignment - padding; end if; start := to_GLubyte_view (userdata) + C.ptrdiff_t ( psm.pack_skip_rows * rowsize + psm.pack_skip_pixels * group_size); elements_per_line := width * components; iter2 := oldimage (oldimage'First)'Access; for i in 0 .. height - 1 loop iter := start; for j in 0 .. elements_per_line - 1 loop declare widget : Type_Widget; begin case gl_Type is when GL_UNSIGNED_BYTE => if index_format then iter.all := GLubyte (iter2.all); iter2 := iter2 + 1; else iter.all := GLubyte (shift_Right (Unsigned_16 (iter2.all), 8)); iter2 := iter2 + 1; end if; when GL_BYTE => if index_format then to_GLbyte_view (iter).all := GLbyte (iter2.all); iter2 := iter2 + 1; else to_GLbyte_view (iter).all := GLbyte (shift_Right (Unsigned_16 (iter2.all), 9)); iter2 := iter2 + 1; end if; when GL_UNSIGNED_SHORT_5_6_5 => for k in C.size_t' (0) .. 2 loop shoveComponents (k) := GLfloat (iter2.all) / 65535.0; iter2 := iter2 + 1; end loop; shove565 (shoveComponents, 0, widget.us (0)'Address); if myswap_bytes /= 0 then GLubyte_view (iter + 0).all := widget.ub (1); GLubyte_view (iter + 1).all := widget.ub (0); else to_GLushort_view (iter).all := widget.us (0); end if; when GL_UNSIGNED_SHORT_4_4_4_4 => for k in C.size_t' (0) .. 3 loop shoveComponents (k) := GLfloat (iter2.all) / 65535.0; iter2 := iter2 + 1; end loop; shove4444 (shoveComponents, 0, widget.us (0)'Address); if myswap_bytes /= 0 then GLubyte_view (iter + 0).all := widget.ub (1); GLubyte_view (iter + 1).all := widget.ub (0); else to_GLushort_view (iter).all := widget.us (0); end if; when GL_UNSIGNED_SHORT_5_5_5_1 => for k in C.size_t' (0) .. 3 loop shoveComponents (k) := GLfloat (iter2.all) / 65535.0; iter2 := iter2 + 1; end loop; shove5551 (shoveComponents, 0, widget.us (0)'Address); if myswap_bytes /= 0 then GLubyte_view (iter + 0).all := widget.ub (1); GLubyte_view (iter + 1).all := widget.ub (0); else to_GLushort_view (iter).all := widget.us (0); end if; when GL_UNSIGNED_SHORT | GL_SHORT => if gl_Type = GL_SHORT then if index_format then widget.s (0) := GLshort (iter2.all); iter2 := iter2 + 1; else widget.s (0) := GLshort (shift_Right (Unsigned_16 (iter2.all), 1)); iter2 := iter2 + 1; end if; else widget.us (0) := iter2.all; iter2 := iter2 + 1; end if; if myswap_bytes /= 0 then GLubyte_view (iter + 0).all := widget.ub (1); GLubyte_view (iter + 1).all := widget.ub (0); else GLubyte_view (iter + 0).all := widget.ub (0); GLubyte_view (iter + 1).all := widget.ub (1); end if; when GL_INT | GL_UNSIGNED_INT | GL_FLOAT => if gl_Type = GL_FLOAT then if index_format then widget.f := GLfloat (iter2.all); iter2 := iter2 + 1; else widget.f := GLfloat (iter2.all) / 65535.0; iter2 := iter2 + 1; end if; elsif gl_Type = GL_UNSIGNED_INT then if index_format then widget.ui := GLuint (iter2.all); iter2 := iter2 + 1; else widget.ui := GLuint (iter2.all) * 65537; iter2 := iter2 + 1; end if; else if index_format then widget.i := GLint (iter2.all); iter2 := iter2 + 1; else widget.i := GLint ((GLuint (iter2.all) * 65537) / 2); iter2 := iter2 + 1; end if; end if; if myswap_bytes /= 0 then GLubyte_view (iter + 3).all := widget.ub (0); GLubyte_view (iter + 2).all := widget.ub (1); GLubyte_view (iter + 1).all := widget.ub (2); GLubyte_view (iter + 0).all := widget.ub (3); else GLubyte_view (iter + 0).all := widget.ub (0); GLubyte_view (iter + 1).all := widget.ub (1); GLubyte_view (iter + 2).all := widget.ub (2); GLubyte_view (iter + 3).all := widget.ub (3); end if; when others => raise GLU_INVALID_TYPE; end case; iter := iter + C.ptrdiff_t (element_size); end; end loop; -- for j start := start + C.ptrdiff_t (rowsize); -- want 'iter' pointing at start, not within, row for assertion purposes iter := start; end loop; -- for i -- iterators should be one byte past end -- if not isTypePackedPixel (gl_Type) then pragma assert (iter2 = oldimage (C.size_t (width * height * components))'Access); else pragma assert (iter2 = oldimage (C.size_t (width * height * elements_per_group (format, 0)))'Access); end if; pragma assert ( iter = to_GLubyte_view (userdata) + C.ptrdiff_t ( rowsize * height + psm.pack_skip_rows * rowsize + psm.pack_skip_pixels * group_size) ); end empty_image; procedure halveImage (components : in GLint; width : in GLuint; height : in GLuint; datain : in GLushort_view; dataout : in GLushort_view) is use GLushort_Pointers; use type GLushort; newwidth, newheight : GLint; the_delta : GLint; s, t : GLushort_view; begin newwidth := GLint (width) / 2; newheight := GLint (height) / 2; the_delta := GLint (width) * components; s := dataout; t := datain; -- Piece o' cake ! -- for i in 0 .. newheight - 1 loop for j in 0 .. newwidth - 1 loop for k in 0 .. components - 1 loop s.all := ( GLushort_view (t + 0 ).all + GLushort_view (t + C.ptrdiff_t (components) ).all + GLushort_view (t + C.ptrdiff_t (the_delta) ).all + GLushort_view (t + C.ptrdiff_t (the_delta + components)).all + 2) / 4; s := s + 1; t := t + 1; end loop; t := t + C.ptrdiff_t (components); end loop; t := t + C.ptrdiff_t (the_delta); end loop; end halveImage; procedure scale_internal (components : in GLint; widthin : in GLint; heightin : in GLint; datain : in GLushort_view; widthout : in GLint; heightout : in GLint; dataout : in GLushort_view) is use GLushort_Pointers; x, lowx, highx, convx, halfconvx : GLfloat; y, lowy, highy, convy, halfconvy : GLfloat; xpercent, ypercent : GLfloat; percent : GLfloat; -- Max components in a format is 4, so... totals : GLfloat_array (0 .. 3); area : GLfloat; yint, xint, xindex, yindex : GLint; temp : GLint; begin if widthin = widthout * 2 and heightin = heightout * 2 then halveImage (components, GLuint (widthin), GLuint (heightin), datain, dataout); return; end if; convy := GLfloat (heightin) / GLfloat (heightout); convx := GLfloat (widthin) / GLfloat (widthout); halfconvx := convx / 2.0; halfconvy := convy / 2.0; for i in 0 .. heightout - 1 loop y := convy * (GLfloat (i) + 0.5); if heightin > heightout then highy := y + halfconvy; lowy := y - halfconvy; else highy := y + 0.5; lowy := y - 0.5; end if; for j in 0 .. widthout - 1 loop x := convx * (GLfloat (j) + 0.5); if widthin > widthout then highx := x + halfconvx; lowx := x - halfconvx; else highx := x + 0.5; lowx := x - 0.5; end if; -- Ok, now apply box filter to box that goes from (lowx, lowy) -- to (highx, highy) on input data into this pixel on output data. -- totals := (others => 0.0); area := 0.0; y := lowy; yint := GLint (GLfloat'Floor (y)); while y < highy loop yindex := (yint + heightin) mod heightin; if highy < GLfloat (yint + 1) then ypercent := highy - y; else ypercent := GLfloat (yint + 1) - y; end if; x := lowx; xint := GLint (GLfloat'Floor (x)); while x < highx loop xindex := (xint + widthin) mod widthin; if highx < GLfloat (xint + 1) then xpercent := highx - x; else xpercent := GLfloat (xint + 1) - x; end if; percent := xpercent * ypercent; area := area + percent; temp := (xindex + (yindex * widthin)) * components; for k in 0 .. C.size_t (components - 1) loop totals (k) := totals (k) + GLfloat (GLushort_view (datain + C.ptrdiff_t (temp) + C.ptrdiff_t (k)).all) * percent; end loop; xint := xint + 1; x := GLfloat (xint); end loop; yint := yint + 1; y := GLfloat (yint); end loop; temp := (j + (i * widthout)) * components; for k in 0 .. C.size_t (components - 1) loop declare Data : GLfloat := (totals (k) + 0.5) / area; -- totals[] should be rounded in the case of enlarging an RGB -- ramp when the type is 332 or 4444 begin Data := GLfloat'Min (Data, GLfloat (GLushort'Last)); GLushort_view (dataout + C.ptrdiff_t (temp) + C.ptrdiff_t (k )).all := GLushort (Data); end; end loop; end loop; -- for j end loop; -- for i end scale_internal; function is_index (format : in GLenum) return Boolean -- TODO: Remove this, it doesn't apply to 'lean' GL types. is begin return False; -- format == GL_COLOR_INDEX || format = GL_STENCIL_INDEX; end is_index; procedure gluScaleImage (format : in GLenum; widthin : in GLsizei; heightin : in GLsizei; typein : in GLenum; datain : in System.Address; widthout : in GLsizei; heightout : in GLsizei; typeout : in GLenum; dataout : in System.Address) is procedure free is new ada.unchecked_Deallocation (GLushort_array, GLushort_array_view); components : GLint; beforeImage : GLushort_array_view; afterImage : GLushort_array_view; psm : PixelStorageModes; begin if widthin = 0 or heightin = 0 or widthout = 0 or heightout = 0 then return; end if; if widthin < 0 or heightin < 0 or widthout < 0 or heightout < 0 then raise GLU_INVALID_VALUE; end if; if not legalFormat (format) or not legalType (typein) or not legalType (typeout) then raise GLU_INVALID_ENUM; end if; if not isLegalFormatForPackedPixelType (format, typein) then raise GLU_INVALID_OPERATION; end if; if not isLegalFormatForPackedPixelType (format, typeout) then raise GLU_INVALID_OPERATION; end if; declare use type C.size_t; before_Size : constant C.size_t := image_size (widthin, heightin, format, GL_UNSIGNED_SHORT); after_Size : constant C.size_t := image_size (widthout, heightout, format, GL_UNSIGNED_SHORT); begin beforeImage := new GLushort_array (0 .. before_Size - 1); afterImage := new GLushort_array (0 .. after_Size - 1); end; retrieveStoreModes (psm); fill_image (psm, widthin, heightin, format, typein, is_index (format), datain, beforeImage); components := elements_per_group (format, 0); scale_internal (components, widthin, heightin, beforeImage (beforeImage'First)'Access, widthout, heightout, afterImage (afterImage'First)'Access); empty_image (psm, widthout, heightout, format, typeout, is_index (format), afterImage, dataout); free (beforeImage); free (afterImage); end gluScaleImage; end GLU;
reznikmm/matreshka
Ada
4,688
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Table.Last_Row_End_Column_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Table_Last_Row_End_Column_Attribute_Node is begin return Self : Table_Last_Row_End_Column_Attribute_Node do Matreshka.ODF_Table.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Table_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Table_Last_Row_End_Column_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Last_Row_End_Column_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Table_URI, Matreshka.ODF_String_Constants.Last_Row_End_Column_Attribute, Table_Last_Row_End_Column_Attribute_Node'Tag); end Matreshka.ODF_Table.Last_Row_End_Column_Attributes;
iyan22/AprendeAda
Ada
543
adb
with datos; use datos; function esta_en_vector (num: in Integer; R: in Lista_Enteros) return Boolean is -- pre: el vector V de la estructura contiene al menos un elemento (V'Last >= 1) -- los elementos no siguen ningún orden -- post: el resultado es True si el valor N esta en V y False si no rdo: Boolean; I: Integer; begin I := R.Numeros'First; rdo := False; while I <= R.Cont and rdo = False loop if R.Numeros(I) = num then rdo:=True; end if; I:=I+1; end loop; return rdo; end esta_en_vector;
sungyeon/drake
Ada
1,467
adb
with System.Address_To_Named_Access_Conversions; with System.Growth; with System.Zero_Terminated_WStrings; with C.basetsd; with C.winbase; with C.windef; with C.winnt; package body System.Program is use type C.basetsd.SSIZE_T; package LPWSTR_Conv is new Address_To_Named_Access_Conversions (C.winnt.WCHAR, C.winnt.LPWSTR); -- implementation function Full_Name return String is package Holder is new Growth.Scoped_Holder ( C.basetsd.SSIZE_T, Component_Size => C.winnt.WCHAR_array'Component_Size); begin Holder.Reserve_Capacity (1024); loop declare Result_Length : C.basetsd.SSIZE_T; begin Result_Length := C.basetsd.SSIZE_T ( C.winbase.GetModuleFileName ( null, LPWSTR_Conv.To_Pointer (Holder.Storage_Address), C.windef.DWORD (Holder.Capacity))); if Result_Length < Holder.Capacity then return Zero_Terminated_WStrings.Value ( LPWSTR_Conv.To_Pointer (Holder.Storage_Address), C.size_t (Result_Length)); end if; end; -- growth declare function Grow is new Growth.Fast_Grow (C.basetsd.SSIZE_T); begin Holder.Reserve_Capacity (Grow (Holder.Capacity)); end; end loop; end Full_Name; end System.Program;
optikos/oasis
Ada
1,023
ads
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with Program.Elements.Expressions; with Program.Lexical_Elements; package Program.Elements.Null_Literals is pragma Pure (Program.Elements.Null_Literals); type Null_Literal is limited interface and Program.Elements.Expressions.Expression; type Null_Literal_Access is access all Null_Literal'Class with Storage_Size => 0; type Null_Literal_Text is limited interface; type Null_Literal_Text_Access is access all Null_Literal_Text'Class with Storage_Size => 0; not overriding function To_Null_Literal_Text (Self : aliased in out Null_Literal) return Null_Literal_Text_Access is abstract; not overriding function Null_Literal_Token (Self : Null_Literal_Text) return not null Program.Lexical_Elements.Lexical_Element_Access is abstract; end Program.Elements.Null_Literals;
zhmu/ananas
Ada
5,620
ads
------------------------------------------------------------------------------ -- -- -- GNAT LIBRARY COMPONENTS -- -- -- -- G N A T . S E C U R E _ H A S H E S . S H A 2 _ 3 2 -- -- -- -- S p e c -- -- -- -- Copyright (C) 2009-2022, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This package provides support for the 32-bit FIPS PUB 180-3 functions -- SHA-224 and SHA-256. -- This is an internal unit and should not be used directly in applications. -- Use GNAT.SHA224 and GNAT.SHA256 instead. with Interfaces; with GNAT.Byte_Swapping; with GNAT.Secure_Hashes.SHA2_Common; package GNAT.Secure_Hashes.SHA2_32 is subtype Word is Interfaces.Unsigned_32; package Hash_State is new Hash_Function_State (Word => Word, Swap => GNAT.Byte_Swapping.Swap4, Hash_Bit_Order => System.High_Order_First); -- SHA-224 and SHA-256 operate on 32-bit big endian words K : constant Hash_State.State (0 .. 63) := [16#428a2f98#, 16#71374491#, 16#b5c0fbcf#, 16#e9b5dba5#, 16#3956c25b#, 16#59f111f1#, 16#923f82a4#, 16#ab1c5ed5#, 16#d807aa98#, 16#12835b01#, 16#243185be#, 16#550c7dc3#, 16#72be5d74#, 16#80deb1fe#, 16#9bdc06a7#, 16#c19bf174#, 16#e49b69c1#, 16#efbe4786#, 16#0fc19dc6#, 16#240ca1cc#, 16#2de92c6f#, 16#4a7484aa#, 16#5cb0a9dc#, 16#76f988da#, 16#983e5152#, 16#a831c66d#, 16#b00327c8#, 16#bf597fc7#, 16#c6e00bf3#, 16#d5a79147#, 16#06ca6351#, 16#14292967#, 16#27b70a85#, 16#2e1b2138#, 16#4d2c6dfc#, 16#53380d13#, 16#650a7354#, 16#766a0abb#, 16#81c2c92e#, 16#92722c85#, 16#a2bfe8a1#, 16#a81a664b#, 16#c24b8b70#, 16#c76c51a3#, 16#d192e819#, 16#d6990624#, 16#f40e3585#, 16#106aa070#, 16#19a4c116#, 16#1e376c08#, 16#2748774c#, 16#34b0bcb5#, 16#391c0cb3#, 16#4ed8aa4a#, 16#5b9cca4f#, 16#682e6ff3#, 16#748f82ee#, 16#78a5636f#, 16#84c87814#, 16#8cc70208#, 16#90befffa#, 16#a4506ceb#, 16#bef9a3f7#, 16#c67178f2#]; -- Constants from FIPS PUB 180-3 function Sigma0 (X : Word) return Word; function Sigma1 (X : Word) return Word; function S0 (X : Word) return Word; function S1 (X : Word) return Word; pragma Inline (Sigma0, Sigma1, S0, S1); -- Elementary functions Sigma^256_0, Sigma^256_1, sigma^256_0, sigma^256_1 -- from FIPS PUB 180-3. procedure Transform is new SHA2_Common.Transform (Hash_State => Hash_State, K => K, Rounds => 64, Sigma0 => Sigma0, Sigma1 => Sigma1, S0 => S0, S1 => S1); SHA224_Init_State : constant Hash_State.State (0 .. 7) := [0 => 16#c1059ed8#, 1 => 16#367cd507#, 2 => 16#3070dd17#, 3 => 16#f70e5939#, 4 => 16#ffc00b31#, 5 => 16#68581511#, 6 => 16#64f98fa7#, 7 => 16#befa4fa4#]; SHA256_Init_State : constant Hash_State.State (0 .. 7) := [0 => 16#6a09e667#, 1 => 16#bb67ae85#, 2 => 16#3c6ef372#, 3 => 16#a54ff53a#, 4 => 16#510e527f#, 5 => 16#9b05688c#, 6 => 16#1f83d9ab#, 7 => 16#5be0cd19#]; -- Initialization vectors from FIPS PUB 180-3 end GNAT.Secure_Hashes.SHA2_32;
clinta/synth
Ada
8,075
ads
-- This file is covered by the Internet Software Consortium (ISC) License -- Reference: ../License.txt -- GCC 6.0 only (skip Container_Checks until identified need arises) pragma Suppress (Tampering_Check); with Ada.Text_IO; with Ada.Calendar; with Ada.Containers.Hashed_Maps; with Ada.Containers.Ordered_Sets; with Ada.Containers.Vectors; with Ada.Characters.Latin_1; with Ada.Directories; with JohnnyText; with Parameters; with Definitions; use Definitions; package PortScan is package JT renames JohnnyText; package AC renames Ada.Containers; package CAL renames Ada.Calendar; package AD renames Ada.Directories; package TIO renames Ada.Text_IO; package LAT renames Ada.Characters.Latin_1; package PM renames Parameters; type count_type is (total, success, failure, ignored, skipped); type dim_handlers is array (count_type) of TIO.File_Type; type port_id is private; port_match_failed : constant port_id; -- Scan the entire ports tree in order with a single, non-recursive pass -- Return True on success function scan_entire_ports_tree (portsdir : String) return Boolean; -- Starting with a single port, recurse to determine a limited but complete -- dependency tree. Repeated calls will augment already existing data. -- Return True on success function scan_single_port (catport : String; always_build : Boolean) return Boolean; -- This procedure causes the reverse dependencies to be calculated, and -- then the extended (recursive) reverse dependencies. The former is -- used progressively to determine when a port is free to build and the -- latter sets the build priority. procedure set_build_priority; -- Wipe out all scan data so new scan can be performed procedure reset_ports_tree; -- Returns the number of cores. The set_cores procedure must be run first. -- set_cores was private previously, but we need the information to set -- intelligent defaults for the configuration file. procedure set_cores; function cores_available return cpu_range; -- Return " (port deleted)" if the catport doesn't exist -- Return " (directory empty)" if the directory exists but has no contents -- Return " (Makefile missing)" when makefile is missing -- otherwise return blank string function obvious_problem (portsdir, catport : String) return String; private max_ports : constant := 28000; scan_slave : constant builders := 9; ss_base : constant String := "/SL09"; watchdog_active : constant Boolean := False; -- not reliable yet, turn off type port_id is range -1 .. max_ports - 1; subtype port_index is port_id range 0 .. port_id'Last; port_match_failed : constant port_id := port_id'First; -- skip "package" because every port has same dependency on ports-mgmt/pkg -- except for pkg itself. Skip "test" because these dependencies are -- not required to build packages. type dependency_type is (fetch, extract, patch, build, library, runtime); subtype LR_set is dependency_type range library .. runtime; bmake_execution : exception; pkgng_execution : exception; make_garbage : exception; nonexistent_port : exception; circular_logic : exception; seek_failure : exception; unknown_format : exception; package subqueue is new AC.Vectors (Element_Type => port_index, Index_Type => port_index); package string_crate is new AC.Vectors (Element_Type => JT.Text, Index_Type => port_index, "=" => JT.SU."="); type queue_record is record ap_index : port_index; reverse_score : port_index; end record; -- Functions for ranking_crate definitions function "<" (L, R : queue_record) return Boolean; package ranking_crate is new AC.Ordered_Sets (Element_Type => queue_record); -- Functions for portkey_crate and package_crate definitions function port_hash (key : JT.Text) return AC.Hash_Type; package portkey_crate is new AC.Hashed_Maps (Key_Type => JT.Text, Element_Type => port_index, Hash => port_hash, Equivalent_Keys => JT.equivalent); package package_crate is new AC.Hashed_Maps (Key_Type => JT.Text, Element_Type => Boolean, Hash => port_hash, Equivalent_Keys => JT.equivalent); -- Functions for block_crate definitions function block_hash (key : port_index) return AC.Hash_Type; function block_ekey (left, right : port_index) return Boolean; package block_crate is new AC.Hashed_Maps (Key_Type => port_index, Element_Type => port_index, Hash => block_hash, Equivalent_Keys => block_ekey); type port_record is record sequence_id : port_index := 0; key_cursor : portkey_crate.Cursor := portkey_crate.No_Element; jobs : builders := 1; ignore_reason : JT.Text := JT.blank; port_version : JT.Text := JT.blank; package_name : JT.Text := JT.blank; pkg_dep_query : JT.Text := JT.blank; ignored : Boolean := False; scanned : Boolean := False; rev_scanned : Boolean := False; unlist_failed : Boolean := False; work_locked : Boolean := False; pkg_present : Boolean := False; remote_pkg : Boolean := False; never_remote : Boolean := False; deletion_due : Boolean := False; use_procfs : Boolean := False; use_linprocfs : Boolean := False; use_watchdog : Boolean := watchdog_active; reverse_score : port_index := 0; librun : block_crate.Map; blocked_by : block_crate.Map; blocks : block_crate.Map; all_reverse : block_crate.Map; options : package_crate.Map; end record; type port_record_access is access all port_record; type dim_make_queue is array (scanners) of subqueue.Vector; type dim_progress is array (scanners) of port_index; type dim_all_ports is array (port_index) of aliased port_record; all_ports : dim_all_ports; ports_keys : portkey_crate.Map; portlist : portkey_crate.Map; make_queue : dim_make_queue; mq_progress : dim_progress := (others => 0); rank_queue : ranking_crate.Set; number_cores : cpu_range := cpu_range'First; lot_number : scanners := 1; lot_counter : port_index := 0; last_port : port_index := 0; prescanned : Boolean := False; procedure iterate_reverse_deps; procedure iterate_drill_down; procedure populate_port_data (target : port_index); procedure drill_down (next_target : port_index; original_target : port_index); -- subroutines for populate_port_data procedure prescan_ports_tree (portsdir : String); procedure grep_Makefile (portsdir, category : String); procedure walk_all_subdirectories (portsdir, category : String); procedure wipe_make_queue; procedure parallel_deep_scan (success : out Boolean; show_progress : Boolean); -- some helper routines function find_colon (Source : String) return Natural; function scrub_phase (Source : String) return JT.Text; function get_catport (PR : port_record) return String; function scan_progress return String; function get_max_lots return scanners; function get_pkg_name (origin : String) return String; type dim_counters is array (count_type) of Natural; -- bulk run variables Flog : dim_handlers; start_time : CAL.Time; stop_time : CAL.Time; bld_counter : dim_counters := (0, 0, 0, 0, 0); end PortScan;
AdaCore/gpr
Ada
182
ads
package p2_1 is function p2_1_0 (Item : Integer) return Integer; function p2_1_1 (Item : Integer) return Integer; function p2_1_2 (Item : Integer) return Integer; end p2_1;
KipodAfterFree/KAF-2019-FireHog
Ada
3,365
ads
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding Samples -- -- -- -- Sample.Helpers -- -- -- -- S P E C -- -- -- ------------------------------------------------------------------------------ -- Copyright (c) 1998 Free Software Foundation, Inc. -- -- -- -- Permission is hereby granted, free of charge, to any person obtaining a -- -- copy of this software and associated documentation files (the -- -- "Software"), to deal in the Software without restriction, including -- -- without limitation the rights to use, copy, modify, merge, publish, -- -- distribute, distribute with modifications, sublicense, and/or sell -- -- copies of the Software, and to permit persons to whom the Software is -- -- furnished to do so, subject to the following conditions: -- -- -- -- The above copyright notice and this permission notice shall be included -- -- in all copies or substantial portions of the Software. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS -- -- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF -- -- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. -- -- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, -- -- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR -- -- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR -- -- THE USE OR OTHER DEALINGS IN THE SOFTWARE. -- -- -- -- Except as contained in this notice, the name(s) of the above copyright -- -- holders shall not be used in advertising or otherwise to promote the -- -- sale, use or other dealings in this Software without prior written -- -- authorization. -- ------------------------------------------------------------------------------ -- Author: Juergen Pfeifer <[email protected]> 1996 -- Version Control -- $Revision: 1.5 $ -- Binding Version 00.93 ------------------------------------------------------------------------------ with Terminal_Interface.Curses; use Terminal_Interface.Curses; -- This package contains some conveniant helper routines used throughout -- this example. -- package Sample.Helpers is procedure Window_Title (Win : in Window; Title : in String); -- Put a title string into the first line of the window procedure Not_Implemented; end Sample.Helpers;
zhmu/ananas
Ada
6,990
ads
------------------------------------------------------------------------------ -- -- -- GNAT LIBRARY COMPONENTS -- -- -- -- A D A . C O N T A I N E R S . I N D E F I N I T E _ H O L D E R S -- -- -- -- S p e c -- -- -- -- Copyright (C) 2011-2022, Free Software Foundation, Inc. -- -- -- -- This specification is derived from the Ada Reference Manual for use with -- -- GNAT. The copyright notice above, and the license provisions that follow -- -- apply solely to the contents of the part following the private keyword. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- ------------------------------------------------------------------------------ private with Ada.Finalization; private with Ada.Streams; private with Ada.Strings.Text_Buffers; generic type Element_Type (<>) is private; with function "=" (Left, Right : Element_Type) return Boolean is <>; package Ada.Containers.Indefinite_Holders is pragma Annotate (CodePeer, Skip_Analysis); pragma Preelaborate (Indefinite_Holders); pragma Remote_Types (Indefinite_Holders); type Holder is tagged private; pragma Preelaborable_Initialization (Holder); Empty_Holder : constant Holder; function "=" (Left, Right : Holder) return Boolean; function To_Holder (New_Item : Element_Type) return Holder; function Is_Empty (Container : Holder) return Boolean; procedure Clear (Container : in out Holder); function Element (Container : Holder) return Element_Type; procedure Replace_Element (Container : in out Holder; New_Item : Element_Type); procedure Query_Element (Container : Holder; Process : not null access procedure (Element : Element_Type)); procedure Update_Element (Container : in out Holder; Process : not null access procedure (Element : in out Element_Type)); type Constant_Reference_Type (Element : not null access constant Element_Type) is private with Implicit_Dereference => Element; type Reference_Type (Element : not null access Element_Type) is private with Implicit_Dereference => Element; function Constant_Reference (Container : aliased Holder) return Constant_Reference_Type; pragma Inline (Constant_Reference); function Reference (Container : aliased in out Holder) return Reference_Type; pragma Inline (Reference); procedure Assign (Target : in out Holder; Source : Holder); function Copy (Source : Holder) return Holder; procedure Move (Target : in out Holder; Source : in out Holder); procedure Swap (Left, Right : in out Holder); private use Ada.Finalization; use Ada.Streams; type Element_Access is access all Element_Type; type Holder_Access is access all Holder; for Holder_Access'Storage_Size use 0; procedure Read (Stream : not null access Ada.Streams.Root_Stream_Type'Class; Container : out Holder); procedure Write (Stream : not null access Ada.Streams.Root_Stream_Type'Class; Container : Holder); type Holder is new Ada.Finalization.Controlled with record Element : Element_Access; Busy : Natural := 0; end record with Put_Image => Put_Image; procedure Put_Image (S : in out Ada.Strings.Text_Buffers.Root_Buffer_Type'Class; V : Holder); for Holder'Read use Read; for Holder'Write use Write; overriding procedure Adjust (Container : in out Holder); overriding procedure Finalize (Container : in out Holder); type Reference_Control_Type is new Controlled with record Container : Holder_Access; end record; overriding procedure Adjust (Control : in out Reference_Control_Type); pragma Inline (Adjust); overriding procedure Finalize (Control : in out Reference_Control_Type); pragma Inline (Finalize); type Constant_Reference_Type (Element : not null access constant Element_Type) is record Control : Reference_Control_Type := raise Program_Error with "uninitialized reference"; -- The RM says, "The default initialization of an object of -- type Constant_Reference_Type or Reference_Type propagates -- Program_Error." end record; procedure Write (Stream : not null access Root_Stream_Type'Class; Item : Constant_Reference_Type); for Constant_Reference_Type'Write use Write; procedure Read (Stream : not null access Root_Stream_Type'Class; Item : out Constant_Reference_Type); for Constant_Reference_Type'Read use Read; type Reference_Type (Element : not null access Element_Type) is record Control : Reference_Control_Type := raise Program_Error with "uninitialized reference"; -- The RM says, "The default initialization of an object of -- type Constant_Reference_Type or Reference_Type propagates -- Program_Error." end record; procedure Write (Stream : not null access Root_Stream_Type'Class; Item : Reference_Type); for Reference_Type'Write use Write; procedure Read (Stream : not null access Root_Stream_Type'Class; Item : out Reference_Type); for Reference_Type'Read use Read; Empty_Holder : constant Holder := (Controlled with null, 0); end Ada.Containers.Indefinite_Holders;
MinimSecure/unum-sdk
Ada
865
adb
-- Copyright 2011-2019 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. with Pck; use Pck; procedure A is FC : Color := Red; SC : Color := Green; begin Do_Nothing (FC'Address); Do_Nothing (SC'Address); end A;
afrl-rq/OpenUxAS
Ada
2,180
adb
package body UxAS.Comms.Transport.Receiver is ------------------------------ -- Add_Subscription_Address -- ------------------------------ procedure Add_Subscription_Address (This : in out Transport_Receiver_Base; Address : String; Result : out Boolean) is Target : constant Subscription_Address := Instance (Subscription_Address_Max_Length, Address); use Subscription_Addresses; -- a hashed map C : Cursor; begin C := Find (This.Subscriptions, Target); if C = No_Element then -- didn't find it Insert (This.Subscriptions, Target); Add_Subscription_Address_To_Socket (Transport_Receiver_Base'Class (This), Address, Result); -- dispatching end if; end Add_Subscription_Address; --------------------------------- -- Remove_Subscription_Address -- --------------------------------- procedure Remove_Subscription_Address (This : in out Transport_Receiver_Base; Address : String; Result : out Boolean) is Target : constant Subscription_Address := Instance (Subscription_Address_Max_Length, Address); use Subscription_Addresses; -- a hashed map C : Cursor; begin C := Find (This.Subscriptions, Target); if C /= No_Element then -- found it Delete (This.Subscriptions, C); Remove_Subscription_Address_From_Socket (Transport_Receiver_Base'Class (This), Address, Result); -- dispatching end if; end Remove_Subscription_Address; --------------------------------------- -- Remove_All_Subscription_Addresses -- --------------------------------------- procedure Remove_All_Subscription_Addresses (This : in out Transport_Receiver_Base; Result : out Boolean) is begin for Target of This.Subscriptions loop Remove_Subscription_Address_From_Socket (Transport_Receiver_Base'Class (This), Value (Target), Result); -- dispatching end loop; Subscription_Addresses.Clear (This.Subscriptions); Result := Subscription_Addresses.Is_Empty (This.Subscriptions); end Remove_All_Subscription_Addresses; end UxAS.Comms.Transport.Receiver;
twdroeger/ada-awa
Ada
7,493
adb
----------------------------------------------------------------------- -- awa-storages-servlets -- Serve files saved in the storage service -- Copyright (C) 2012, 2016, 2019 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Strings.Unbounded; with Util.Log.Loggers; with ADO.Objects; with Servlet.Routes; with ASF.Streams; with AWA.Storages.Services; with AWA.Storages.Modules; package body AWA.Storages.Servlets is Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("AWA.Storages.Servlets"); -- ------------------------------ -- Called by the servlet container to indicate to a servlet that the servlet -- is being placed into service. -- ------------------------------ overriding procedure Initialize (Server : in out Storage_Servlet; Context : in Servlet.Core.Servlet_Registry'Class) is begin null; end Initialize; -- ------------------------------ -- Called by the server (via the service method) to allow a servlet to handle -- a GET request. -- -- Overriding this method to support a GET request also automatically supports -- an HTTP HEAD request. A HEAD request is a GET request that returns no body -- in the response, only the request header fields. -- -- When overriding this method, read the request data, write the response headers, -- get the response's writer or output stream object, and finally, write the -- response data. It's best to include content type and encoding. -- When using a PrintWriter object to return the response, set the content type -- before accessing the PrintWriter object. -- -- The servlet container must write the headers before committing the response, -- because in HTTP the headers must be sent before the response body. -- -- Where possible, set the Content-Length header (with the -- Response.Set_Content_Length method), to allow the servlet container -- to use a persistent connection to return its response to the client, -- improving performance. The content length is automatically set if the entire -- response fits inside the response buffer. -- -- When using HTTP 1.1 chunked encoding (which means that the response has a -- Transfer-Encoding header), do not set the Content-Length header. -- -- The GET method should be safe, that is, without any side effects for which -- users are held responsible. For example, most form queries have no side effects. -- If a client request is intended to change stored data, the request should use -- some other HTTP method. -- -- The GET method should also be idempotent, meaning that it can be safely repeated. -- Sometimes making a method safe also makes it idempotent. For example, repeating -- queries is both safe and idempotent, but buying a product online or modifying -- data is neither safe nor idempotent. -- -- If the request is incorrectly formatted, Do_Get returns an HTTP "Bad Request" -- ------------------------------ overriding procedure Do_Get (Server : in Storage_Servlet; Request : in out ASF.Requests.Request'Class; Response : in out ASF.Responses.Response'Class) is URI : constant String := Request.Get_Request_URI; Data : ADO.Blob_Ref; Mime : Ada.Strings.Unbounded.Unbounded_String; Name : Ada.Strings.Unbounded.Unbounded_String; Date : Ada.Calendar.Time; Format : Get_Type; begin Format := Storage_Servlet'Class (Server).Get_Format (Request); if Format = INVALID then Log.Info ("GET: {0}: invalid format", URI); Response.Send_Error (ASF.Responses.SC_NOT_FOUND); return; end if; Storage_Servlet'Class (Server).Load (Request, Name, Mime, Date, Data); if Data.Is_Null then Log.Info ("GET: {0}: storage file not found", URI); Response.Send_Error (ASF.Responses.SC_NOT_FOUND); return; end if; Log.Info ("GET: {0}", URI); -- Send the file. Response.Set_Content_Type (Ada.Strings.Unbounded.To_String (Mime)); if Format = AS_CONTENT_DISPOSITION and Ada.Strings.Unbounded.Length (Name) > 0 then Response.Add_Header ("Content-Disposition", "attachment; filename=" & Ada.Strings.Unbounded.To_String (Name)); end if; declare Output : ASF.Streams.Print_Stream := Response.Get_Output_Stream; begin Output.Write (Data.Value.Data); end; exception when Servlet.Routes.No_Parameter => Log.Info ("GET: {0}: Invalid servlet-mapping, a path parameter is missing", URI); Response.Send_Error (ASF.Responses.SC_NOT_FOUND); return; when ADO.Objects.NOT_FOUND | Constraint_Error => Log.Info ("GET: {0}: Storage file not found", URI); Response.Send_Error (ASF.Responses.SC_NOT_FOUND); return; end Do_Get; -- ------------------------------ -- Load the data content that correspond to the GET request and get the name as well -- as mime-type and date. -- ------------------------------ procedure Load (Server : in Storage_Servlet; Request : in out ASF.Requests.Request'Class; Name : out Ada.Strings.Unbounded.Unbounded_String; Mime : out Ada.Strings.Unbounded.Unbounded_String; Date : out Ada.Calendar.Time; Data : out ADO.Blob_Ref) is pragma Unreferenced (Server); Store : constant String := Request.Get_Path_Parameter (1); Manager : constant Services.Storage_Service_Access := Storages.Modules.Get_Storage_Manager; Id : ADO.Identifier; begin if Store'Length = 0 then Log.Info ("Invalid storage URI: {0}", Store); return; end if; -- Extract the storage identifier from the URI. Id := ADO.Identifier'Value (Store); Log.Info ("GET storage file {0}", Store); Manager.Load (From => Id, Name => Name, Mime => Mime, Date => Date, Into => Data); end Load; -- ------------------------------ -- Get the expected return mode (content disposition for download or inline). -- ------------------------------ function Get_Format (Server : in Storage_Servlet; Request : in ASF.Requests.Request'Class) return Get_Type is pragma Unreferenced (Server); Format : constant String := Request.Get_Path_Parameter (2); begin if Format = "view" then return DEFAULT; elsif Format = "download" then return AS_CONTENT_DISPOSITION; else return INVALID; end if; end Get_Format; end AWA.Storages.Servlets;
optikos/ada-lsp
Ada
1,327
ads
-- Copyright (c) 2017 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with LSP.Messages; with Incr.Nodes.Tokens; with Ada_LSP.Documents; package Ada_LSP.Completions is type Context is tagged limited private; not overriding function Token (Self : Context) return Incr.Nodes.Tokens.Token_Access; not overriding function Document (Self : Context) return Ada_LSP.Documents.Constant_Document_Access; not overriding procedure Set_Token (Self : in out Context; Token : Incr.Nodes.Tokens.Token_Access; Offset : Positive); not overriding procedure Set_Document (Self : in out Context; Value : Ada_LSP.Documents.Constant_Document_Access); type Handler is limited interface; type Handler_Access is access all Handler'Class; not overriding procedure Fill_Completion_List (Self : Handler; Context : Ada_LSP.Completions.Context'Class; Result : in out LSP.Messages.CompletionList) is abstract; private type Context is tagged limited record Document : Ada_LSP.Documents.Constant_Document_Access; Token : Incr.Nodes.Tokens.Token_Access; Offset : Positive := 1; end record; end Ada_LSP.Completions;
AdaCore/Ada_Drivers_Library
Ada
2,637
ads
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2015-2016, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ package STM32.RCC is Unknown_Device : exception; -- Raised by the routines below for a device passed as an actual parameter -- when that device is not present on the given hardware instance. procedure SYSCFG_Clock_Enable with Inline; end STM32.RCC;
ytomino/vampire
Ada
262
ads
-- The Village of Vampire by YT, このソースコードはNYSLです with Serialization; package Tabula.Villages.Village_IO is package Village_State_IO is new Serialization.IO_Enumeration (Tabula.Villages.Village_State); end Tabula.Villages.Village_IO;
reznikmm/matreshka
Ada
4,682
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2013, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ package Matreshka.ODF_Elements.Table.Table_Row is type Table_Table_Row_Node is new Matreshka.ODF_Elements.Table.Table_Node_Base with null record; type Table_Table_Row_Access is access all Table_Table_Row_Node'Class; overriding procedure Enter_Element (Self : not null access Table_Table_Row_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); -- Dispatch call to corresponding subprogram of visitor interface. overriding function Get_Local_Name (Self : not null access constant Table_Table_Row_Node) return League.Strings.Universal_String; overriding procedure Leave_Element (Self : not null access Table_Table_Row_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); -- Dispatch call to corresponding subprogram of visitor interface. overriding procedure Visit_Element (Self : not null access Table_Table_Row_Node; Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); -- Dispatch call to corresponding subprogram of iterator interface. end Matreshka.ODF_Elements.Table.Table_Row;
FrankBuss/Ada_Synth
Ada
4,065
adb
package body MIDI_Synthesizer is function Create_Synthesizer return access Synthesizer is Ret : constant access Synthesizer := new Synthesizer; Base : Float := 8.1757989156; -- MIDI note C1 0 begin Ret.MIDI_Parser := Create_Parser (Ret); for I in Ret.MIDI_Notes'Range loop Ret.MIDI_Notes (I) := Base; Base := Base * 1.059463094359; -- 2^(1/12) end loop; return Ret; end Create_Synthesizer; function Next_Sample (Self : in out Synthesizer) return Float is Sample : Float; begin -- update generator Self.Generator0.PhaseAccumulator := Self.Generator0.PhaseAccumulator + Self.Generator0.PhaseIncrement; if Self.Generator0.PhaseAccumulator > 1.0 then Self.Generator0.PhaseAccumulator := Self.Generator0.PhaseAccumulator - 1.0; end if; -- update envelope case Self.ADSR0.State is when Idle => null; when Attack => Self.ADSR0.Level := Self.ADSR0.Level + Self.ADSR0.Attack; if Self.ADSR0.Level >= 1.0 then Self.ADSR0.State := Decay; Self.ADSR0.Level := 1.0; end if; when Decay => Self.ADSR0.Level := Self.ADSR0.Level - Self.ADSR0.Decay; if Self.ADSR0.Level <= Self.ADSR0.Sustain then Self.ADSR0.State := Sustain; Self.ADSR0.Level := Self.ADSR0.Sustain; end if; when Sustain => null; when Release => Self.ADSR0.Level := Self.ADSR0.Level - Self.ADSR0.Release; if Self.ADSR0.Level <= 0.0 then Self.ADSR0.State := Idle; Self.ADSR0.Level := 0.0; end if; end case; -- return next sample, clipped to -1/+1 Sample := (Self.Generator0.PhaseAccumulator - 0.5) * Self.ADSR0.Level; if Sample > 1.0 then Sample := 1.0; end if; if Sample < -1.0 then Sample := -1.0; end if; return Sample; end Next_Sample; procedure Parse_MIDI_Byte (Self : in out Synthesizer; Received : Unsigned_8) is begin Self.MIDI_Parser.Parse (Received); end Parse_MIDI_Byte; overriding procedure Note_On (Self : in out Synthesizer; Channel : Unsigned_8; Note : Unsigned_8; Velocity : Unsigned_8) is pragma Unreferenced (Channel); pragma Unreferenced (Velocity); begin Self.ADSR0.State := Attack; Self.ADSR0.Level := 0.0; Self.Generator0.PhaseIncrement := Self.MIDI_Notes (Integer (Note)) / Samplerate; end Note_On; overriding procedure Note_Off (Self : in out Synthesizer; Channel : Unsigned_8; Note : Unsigned_8; Velocity : Unsigned_8) is pragma Unreferenced (Channel); pragma Unreferenced (Note); pragma Unreferenced (Velocity); begin Self.ADSR0.State := Release; end Note_Off; -- Testing with an AKAI MPK mini: -- The 8 rotary encoders are working in absolute mode. -- The following valus are sent: -- B1 0x yz -- where x is the knob number (1..8) and yz is the value (0..7f) -- (all values hex). overriding procedure Control_Change (Self : in out Synthesizer; Channel : Unsigned_8; Controller_Number : Unsigned_8; Controller_Value : Unsigned_8) is pragma Unreferenced (Channel); begin case Controller_Number is when 1 => Self.ADSR0.Attack := Float (128 - Controller_Value) * 0.5 / Samplerate; when 2 => Self.ADSR0.Decay := Float (128 - Controller_Value) * 0.5 / Samplerate; when 3 => Self.ADSR0.Sustain := Float (Controller_Value) * 0.007; when 4 => Self.ADSR0.Release := Float (128 - Controller_Value) * 0.02 / Samplerate; when others => null; end case; end Control_Change; end MIDI_Synthesizer;
reznikmm/gela
Ada
1,405
ads
-- This package provides types related to semantic information. package Gela.Semantic_Types is pragma Preelaborate; type Unit_Kinds is (A_Package_Body, A_Function_Body, A_Procedure_Body, A_Procedure, A_Function, A_Package, A_Generic_Procedure, A_Generic_Function, A_Generic_Package, A_Package_Instance, A_Procedure_Instance, A_Function_Instance, A_Package_Renaming, A_Generic_Package_Renaming, A_Generic_Procedure_Renaming, A_Generic_Function_Renaming); type Env_Index is new Natural; -- Index to reference an instance of environment state type Error_Set_Index is new Natural; -- Index to reference a set of errors type Type_View_Index is new Natural; -- Index of type view type Value_Index is new Natural; -- Index of static value -- See also Gela.Lexical_Types.Operators type Static_Operator is (Less_Operator, Equal_Operator, Greater_Operator, Hyphen_Operator, Slash_Operator, Star_Operator, Ampersand_Operator, Plus_Operator, Less_Or_Equal_Operator, Greater_Or_Equal_Operator, Inequality_Operator, Double_Star_Operator, Or_Operator, And_Operator, Xor_Operator, Mod_Operator, Rem_Operator, Abs_Operator, Not_Operator); end Gela.Semantic_Types;
Heziode/lsystem-editor
Ada
1,615
adb
------------------------------------------------------------------------------- -- LSE -- L-System Editor -- Author: Heziode -- -- License: -- MIT License -- -- Copyright (c) 2018 Quentin Dauprat (Heziode) <[email protected]> -- -- Permission is hereby granted, free of charge, to any person obtaining a -- copy of this software and associated documentation files (the "Software"), -- to deal in the Software without restriction, including without limitation -- the rights to use, copy, modify, merge, publish, distribute, sublicense, -- and/or sell copies of the Software, and to permit persons to whom the -- Software is furnished to do so, subject to the following conditions: -- -- The above copyright notice and this permission notice shall be included in -- all copies or substantial portions of the Software. -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR -- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY, -- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE -- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER -- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING -- FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER -- DEALINGS IN THE SOFTWARE. ------------------------------------------------------------------------------- package body LSE.Model.L_System.Error is function Get_Error_Type (This : Instance) return Error_Type.Instance is begin return This.Error; end Get_Error_Type; end LSE.Model.L_System.Error;
reznikmm/matreshka
Ada
18,324
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Elements; with AMF.Internals.Element_Collections; with AMF.Internals.Helpers; with AMF.Internals.Tables.OCL_Attributes; with AMF.UML.Comments.Collections; with AMF.UML.Dependencies.Collections; with AMF.UML.Elements.Collections; with AMF.UML.Enumeration_Literals; with AMF.UML.Named_Elements; with AMF.UML.Namespaces.Collections; with AMF.UML.Packages.Collections; with AMF.UML.String_Expressions; with AMF.UML.Types; with AMF.Visitors.OCL_Iterators; with AMF.Visitors.OCL_Visitors; with League.Strings.Internals; with Matreshka.Internals.Strings; package body AMF.Internals.OCL_Enum_Literal_Exps is ------------------------------- -- Get_Referred_Enum_Literal -- ------------------------------- overriding function Get_Referred_Enum_Literal (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Enumeration_Literals.UML_Enumeration_Literal_Access is begin return AMF.UML.Enumeration_Literals.UML_Enumeration_Literal_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Referred_Enum_Literal (Self.Element))); end Get_Referred_Enum_Literal; ------------------------------- -- Set_Referred_Enum_Literal -- ------------------------------- overriding procedure Set_Referred_Enum_Literal (Self : not null access OCL_Enum_Literal_Exp_Proxy; To : AMF.UML.Enumeration_Literals.UML_Enumeration_Literal_Access) is begin AMF.Internals.Tables.OCL_Attributes.Internal_Set_Referred_Enum_Literal (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Referred_Enum_Literal; -------------- -- Get_Type -- -------------- overriding function Get_Type (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Types.UML_Type_Access is begin return AMF.UML.Types.UML_Type_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Type (Self.Element))); end Get_Type; -------------- -- Set_Type -- -------------- overriding procedure Set_Type (Self : not null access OCL_Enum_Literal_Exp_Proxy; To : AMF.UML.Types.UML_Type_Access) is begin AMF.Internals.Tables.OCL_Attributes.Internal_Set_Type (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Type; --------------------------- -- Get_Client_Dependency -- --------------------------- overriding function Get_Client_Dependency (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is begin return AMF.UML.Dependencies.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Client_Dependency (Self.Element))); end Get_Client_Dependency; -------------- -- Get_Name -- -------------- overriding function Get_Name (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.Optional_String is begin declare use type Matreshka.Internals.Strings.Shared_String_Access; Aux : constant Matreshka.Internals.Strings.Shared_String_Access := AMF.Internals.Tables.OCL_Attributes.Internal_Get_Name (Self.Element); begin if Aux = null then return (Is_Empty => True); else return (False, League.Strings.Internals.Create (Aux)); end if; end; end Get_Name; -------------- -- Set_Name -- -------------- overriding procedure Set_Name (Self : not null access OCL_Enum_Literal_Exp_Proxy; To : AMF.Optional_String) is begin if To.Is_Empty then AMF.Internals.Tables.OCL_Attributes.Internal_Set_Name (Self.Element, null); else AMF.Internals.Tables.OCL_Attributes.Internal_Set_Name (Self.Element, League.Strings.Internals.Internal (To.Value)); end if; end Set_Name; ------------------------- -- Get_Name_Expression -- ------------------------- overriding function Get_Name_Expression (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.String_Expressions.UML_String_Expression_Access is begin return AMF.UML.String_Expressions.UML_String_Expression_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Name_Expression (Self.Element))); end Get_Name_Expression; ------------------------- -- Set_Name_Expression -- ------------------------- overriding procedure Set_Name_Expression (Self : not null access OCL_Enum_Literal_Exp_Proxy; To : AMF.UML.String_Expressions.UML_String_Expression_Access) is begin AMF.Internals.Tables.OCL_Attributes.Internal_Set_Name_Expression (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Name_Expression; ------------------- -- Get_Namespace -- ------------------- overriding function Get_Namespace (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin return AMF.UML.Namespaces.UML_Namespace_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Namespace (Self.Element))); end Get_Namespace; ------------------------ -- Get_Qualified_Name -- ------------------------ overriding function Get_Qualified_Name (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.Optional_String is begin declare use type Matreshka.Internals.Strings.Shared_String_Access; Aux : constant Matreshka.Internals.Strings.Shared_String_Access := AMF.Internals.Tables.OCL_Attributes.Internal_Get_Qualified_Name (Self.Element); begin if Aux = null then return (Is_Empty => True); else return (False, League.Strings.Internals.Create (Aux)); end if; end; end Get_Qualified_Name; -------------------- -- Get_Visibility -- -------------------- overriding function Get_Visibility (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Optional_UML_Visibility_Kind is begin return AMF.Internals.Tables.OCL_Attributes.Internal_Get_Visibility (Self.Element); end Get_Visibility; -------------------- -- Set_Visibility -- -------------------- overriding procedure Set_Visibility (Self : not null access OCL_Enum_Literal_Exp_Proxy; To : AMF.UML.Optional_UML_Visibility_Kind) is begin AMF.Internals.Tables.OCL_Attributes.Internal_Set_Visibility (Self.Element, To); end Set_Visibility; ----------------------- -- Get_Owned_Comment -- ----------------------- overriding function Get_Owned_Comment (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Comments.Collections.Set_Of_UML_Comment is begin return AMF.UML.Comments.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Owned_Comment (Self.Element))); end Get_Owned_Comment; ----------------------- -- Get_Owned_Element -- ----------------------- overriding function Get_Owned_Element (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Elements.Collections.Set_Of_UML_Element is begin return AMF.UML.Elements.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Owned_Element (Self.Element))); end Get_Owned_Element; --------------- -- Get_Owner -- --------------- overriding function Get_Owner (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Elements.UML_Element_Access is begin return AMF.UML.Elements.UML_Element_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.OCL_Attributes.Internal_Get_Owner (Self.Element))); end Get_Owner; -------------------- -- All_Namespaces -- -------------------- overriding function All_Namespaces (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Namespaces.Collections.Ordered_Set_Of_UML_Namespace is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "All_Namespaces unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.All_Namespaces"; return All_Namespaces (Self); end All_Namespaces; ------------------------- -- All_Owning_Packages -- ------------------------- overriding function All_Owning_Packages (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Packages.Collections.Set_Of_UML_Package is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.All_Owning_Packages"; return All_Owning_Packages (Self); end All_Owning_Packages; ----------------------------- -- Is_Distinguishable_From -- ----------------------------- overriding function Is_Distinguishable_From (Self : not null access constant OCL_Enum_Literal_Exp_Proxy; N : AMF.UML.Named_Elements.UML_Named_Element_Access; Ns : AMF.UML.Namespaces.UML_Namespace_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.Is_Distinguishable_From"; return Is_Distinguishable_From (Self, N, Ns); end Is_Distinguishable_From; --------------- -- Namespace -- --------------- overriding function Namespace (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.Namespace"; return Namespace (Self); end Namespace; -------------------- -- Qualified_Name -- -------------------- overriding function Qualified_Name (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return League.Strings.Universal_String is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Qualified_Name unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.Qualified_Name"; return Qualified_Name (Self); end Qualified_Name; --------------- -- Separator -- --------------- overriding function Separator (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return League.Strings.Universal_String is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Separator unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.Separator"; return Separator (Self); end Separator; ------------------------ -- All_Owned_Elements -- ------------------------ overriding function All_Owned_Elements (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return AMF.UML.Elements.Collections.Set_Of_UML_Element is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "All_Owned_Elements unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.All_Owned_Elements"; return All_Owned_Elements (Self); end All_Owned_Elements; ------------------- -- Must_Be_Owned -- ------------------- overriding function Must_Be_Owned (Self : not null access constant OCL_Enum_Literal_Exp_Proxy) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Must_Be_Owned unimplemented"); raise Program_Error with "Unimplemented procedure OCL_Enum_Literal_Exp_Proxy.Must_Be_Owned"; return Must_Be_Owned (Self); end Must_Be_Owned; ------------------- -- Enter_Element -- ------------------- overriding procedure Enter_Element (Self : not null access constant OCL_Enum_Literal_Exp_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.OCL_Visitors.OCL_Visitor'Class then AMF.Visitors.OCL_Visitors.OCL_Visitor'Class (Visitor).Enter_Enum_Literal_Exp (AMF.OCL.Enum_Literal_Exps.OCL_Enum_Literal_Exp_Access (Self), Control); end if; end Enter_Element; ------------------- -- Leave_Element -- ------------------- overriding procedure Leave_Element (Self : not null access constant OCL_Enum_Literal_Exp_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.OCL_Visitors.OCL_Visitor'Class then AMF.Visitors.OCL_Visitors.OCL_Visitor'Class (Visitor).Leave_Enum_Literal_Exp (AMF.OCL.Enum_Literal_Exps.OCL_Enum_Literal_Exp_Access (Self), Control); end if; end Leave_Element; ------------------- -- Visit_Element -- ------------------- overriding procedure Visit_Element (Self : not null access constant OCL_Enum_Literal_Exp_Proxy; Iterator : in out AMF.Visitors.Abstract_Iterator'Class; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Iterator in AMF.Visitors.OCL_Iterators.OCL_Iterator'Class then AMF.Visitors.OCL_Iterators.OCL_Iterator'Class (Iterator).Visit_Enum_Literal_Exp (Visitor, AMF.OCL.Enum_Literal_Exps.OCL_Enum_Literal_Exp_Access (Self), Control); end if; end Visit_Element; end AMF.Internals.OCL_Enum_Literal_Exps;
sparre/JSA
Ada
1,230
ads
-- Type for objects which _may_ have a value. -- -- License: ISC generic type Element is private; package JSA.Generic_Optional_Value is type Instance (Set : Boolean := False) is record case Set is when True => Value : Element; when False => null; end case; end record; function "+" (Item : in Element) return Instance; function "+" (Item : in Instance) return Element with Pre => Item.Set; function "=" (Left : in Element; Right : in Instance) return Boolean; function "=" (Left : in Instance; Right : in Element) return Boolean; generic with function Image (Item : in Element) return String; function Image (Item : in Instance) return String; generic with function Value (Item : in String) return Element; function Value (Item : in String) return Instance; protected type Buffer is procedure Set (Item : in Element); procedure Clear; entry Get (Item : out Instance); private Stored : Instance; Changed : Boolean := False; end Buffer; end JSA.Generic_Optional_Value;
sungyeon/drake
Ada
779
ads
pragma License (Unrestricted); package Ada.Calendar.Arithmetic is -- Arithmetic on days: type Day_Count is range -366 * (1 + Year_Number'Last - Year_Number'First) .. +366 * (1 + Year_Number'Last - Year_Number'First); subtype Leap_Seconds_Count is Integer range -2047 .. 2047; procedure Difference ( Left, Right : Time; Days : out Day_Count; Seconds : out Duration; Leap_Seconds : out Leap_Seconds_Count); function "+" (Left : Time; Right : Day_Count) return Time; function "+" (Left : Day_Count; Right : Time) return Time; function "-" (Left : Time; Right : Day_Count) return Time; function "-" (Left, Right : Time) return Day_Count; pragma Inline ("+"); pragma Inline ("-"); end Ada.Calendar.Arithmetic;
reznikmm/matreshka
Ada
4,107
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Table_First_Row_Start_Column_Attributes; package Matreshka.ODF_Table.First_Row_Start_Column_Attributes is type Table_First_Row_Start_Column_Attribute_Node is new Matreshka.ODF_Table.Abstract_Table_Attribute_Node and ODF.DOM.Table_First_Row_Start_Column_Attributes.ODF_Table_First_Row_Start_Column_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Table_First_Row_Start_Column_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Table_First_Row_Start_Column_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Table.First_Row_Start_Column_Attributes;
merced317/scirun4plus
Ada
4,246
adb
---------------------------------------------------------------- -- ZLib for Ada thick binding. -- -- -- -- Copyright (C) 2002-2003 Dmitriy Anisimkov -- -- -- -- Open source license information is in the zlib.ads file. -- ---------------------------------------------------------------- -- $Id: read.adb,v 1.1 2008/12/19 14:44:49 dkf Exp $ -- Test/demo program for the generic read interface. with Ada.Numerics.Discrete_Random; with Ada.Streams; with Ada.Text_IO; with ZLib; procedure Read is use Ada.Streams; ------------------------------------ -- Test configuration parameters -- ------------------------------------ File_Size : Stream_Element_Offset := 100_000; Continuous : constant Boolean := False; -- If this constant is True, the test would be repeated again and again, -- with increment File_Size for every iteration. Header : constant ZLib.Header_Type := ZLib.Default; -- Do not use Header other than Default in ZLib versions 1.1.4 and older. Init_Random : constant := 8; -- We are using the same random sequence, in case of we catch bug, -- so we would be able to reproduce it. -- End -- Pack_Size : Stream_Element_Offset; Offset : Stream_Element_Offset; Filter : ZLib.Filter_Type; subtype Visible_Symbols is Stream_Element range 16#20# .. 16#7E#; package Random_Elements is new Ada.Numerics.Discrete_Random (Visible_Symbols); Gen : Random_Elements.Generator; Period : constant Stream_Element_Offset := 200; -- Period constant variable for random generator not to be very random. -- Bigger period, harder random. Read_Buffer : Stream_Element_Array (1 .. 2048); Read_First : Stream_Element_Offset; Read_Last : Stream_Element_Offset; procedure Reset; procedure Read (Item : out Stream_Element_Array; Last : out Stream_Element_Offset); -- this procedure is for generic instantiation of -- ZLib.Read -- reading data from the File_In. procedure Read is new ZLib.Read (Read, Read_Buffer, Rest_First => Read_First, Rest_Last => Read_Last); ---------- -- Read -- ---------- procedure Read (Item : out Stream_Element_Array; Last : out Stream_Element_Offset) is begin Last := Stream_Element_Offset'Min (Item'Last, Item'First + File_Size - Offset); for J in Item'First .. Last loop if J < Item'First + Period then Item (J) := Random_Elements.Random (Gen); else Item (J) := Item (J - Period); end if; Offset := Offset + 1; end loop; end Read; ----------- -- Reset -- ----------- procedure Reset is begin Random_Elements.Reset (Gen, Init_Random); Pack_Size := 0; Offset := 1; Read_First := Read_Buffer'Last + 1; Read_Last := Read_Buffer'Last; end Reset; begin Ada.Text_IO.Put_Line ("ZLib " & ZLib.Version); loop for Level in ZLib.Compression_Level'Range loop Ada.Text_IO.Put ("Level =" & ZLib.Compression_Level'Image (Level)); -- Deflate using generic instantiation. ZLib.Deflate_Init (Filter, Level, Header => Header); Reset; Ada.Text_IO.Put (Stream_Element_Offset'Image (File_Size) & " ->"); loop declare Buffer : Stream_Element_Array (1 .. 1024); Last : Stream_Element_Offset; begin Read (Filter, Buffer, Last); Pack_Size := Pack_Size + Last - Buffer'First + 1; exit when Last < Buffer'Last; end; end loop; Ada.Text_IO.Put_Line (Stream_Element_Offset'Image (Pack_Size)); ZLib.Close (Filter); end loop; exit when not Continuous; File_Size := File_Size + 1; end loop; end Read;
sungyeon/drake
Ada
523
ads
pragma License (Unrestricted); -- extended unit with Ada.References.Wide_Wide_Strings; with Ada.Streams.Block_Transmission.Wide_Wide_Strings; with Ada.Strings.Generic_Bounded; package Ada.Strings.Bounded_Wide_Wide_Strings is new Generic_Bounded ( Wide_Wide_Character, Wide_Wide_String, Streams.Block_Transmission.Wide_Wide_Strings.Read, Streams.Block_Transmission.Wide_Wide_Strings.Write, References.Wide_Wide_Strings.Slicing); pragma Preelaborate (Ada.Strings.Bounded_Wide_Wide_Strings);
AdaCore/libadalang
Ada
295
adb
package body Gen is package body Nested is function Foo return Integer is begin return 12; end Foo; function Bar return Poo is begin return (null record); end Bar; function Baz return Rec is (null record); end Nested; end Gen;
onox/orka
Ada
4,940
adb
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2017 onox <[email protected]> -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. with Ada.Numerics.Generic_Elementary_Functions; package body Orka.Transforms.SIMD_Vectors is function "-" (Elements : Point) return Point is Result : Vector4 := -Vector4 (Elements); begin Result (W) := Elements (W); return Point (Result); end "-"; function "-" (Left, Right : Direction) return Direction is (Direction (Vector4 (Left) - Vector4 (Right))); function "+" (Left, Right : Direction) return Direction is (Direction (Vector4 (Left) + Vector4 (Right))); function "+" (Left : Point; Right : Direction) return Point is (Point (Vector4 (Left) + Vector4 (Right))); function "+" (Left : Direction; Right : Point) return Point is (Point (Vector4 (Left) + Vector4 (Right))); function "-" (Left, Right : Point) return Direction is (Direction (Vector4 (Left) - Vector4 (Right))); ---------------------------------------------------------------------------- package EF is new Ada.Numerics.Generic_Elementary_Functions (Element_Type); function Magnitude2 (Elements : Vector_Type) return Element_Type is (Sum (Elements * Elements)); function "*" (Factor : Element_Type; Elements : Vector_Type) return Vector_Type is begin return (Factor, Factor, Factor, Factor) * Elements; end "*"; function "*" (Elements : Vector_Type; Factor : Element_Type) return Vector_Type is (Factor * Elements); function "*" (Factor : Element_Type; Elements : Direction) return Direction is (Direction (Factor * Vector4 (Elements))); function "*" (Elements : Direction; Factor : Element_Type) return Direction is (Factor * Elements); function Magnitude (Elements : Vector_Type) return Element_Type is begin return EF.Sqrt (Magnitude2 (Elements)); end Magnitude; function Normalize (Elements : Vector_Type) return Vector_Type is Length : constant Element_Type := Magnitude (Elements); begin return Divide_Or_Zero (Elements, (Length, Length, Length, Length)); end Normalize; function Normalize_Fast (Elements : Vector_Type) return Vector_Type is Length_Squared : constant Element_Type := Magnitude2 (Elements); begin return Elements * Reciprocal_Sqrt ((others => Length_Squared)); end Normalize_Fast; function Normalized (Elements : Vector_Type) return Boolean is function Is_Equivalent (Expected, Result : Element_Type) return Boolean is -- Because the square root is not computed, the bounds need -- to be increased to +/- 2 * Epsilon + Epsilon ** 2. Since -- Epsilon < 1, we can simply take +/- 3 * Epsilon Epsilon : constant Element_Type := 3.0 * Element_Type'Model_Epsilon; begin return abs (Result - Expected) <= Epsilon; end Is_Equivalent; begin return Is_Equivalent (1.0, Magnitude2 (Elements)); end Normalized; function Distance (Left, Right : Point) return Element_Type is (Magnitude (Vector_Type (Left - Right))); function Projection (Elements, Direction : Vector_Type) return Vector_Type is Unit_Direction : constant Vector_Type := Normalize (Direction); begin -- The dot product gives the magnitude of the projected vector: -- |A_b| = |A| * cos(theta) = A . U_b return Dot (Elements, Unit_Direction) * Unit_Direction; end Projection; function Perpendicular (Elements, Direction : Vector_Type) return Vector_Type is (Elements - Projection (Elements, Direction)); function Angle (Left, Right : Vector_Type) return Element_Type is begin return EF.Arccos (Dot (Left, Right) / (Magnitude (Left) * Magnitude (Right))); end Angle; function Dot (Left, Right : Vector_Type) return Element_Type is (Sum (Left * Right)); function Slerp (Left, Right : Vector_Type; Weight : Element_Type) return Vector_Type is Cos_Angle : constant Element_Type := Dot (Left, Right); Angle : constant Element_Type := EF.Arccos (Cos_Angle); SA : constant Element_Type := EF.Sin (Angle); SL : constant Element_Type := EF.Sin ((1.0 - Weight) * Angle); SR : constant Element_Type := EF.Sin (Weight * Angle); begin return (SL / SA) * Left + (SR / SA) * Right; end Slerp; end Orka.Transforms.SIMD_Vectors;
Fabien-Chouteau/Ada_Drivers_Library
Ada
4,829
ads
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2015-2018, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ package HAL.GPIO is type Capability is (Unknown_Mode, Input, Output, -- Mode Floating, Pull_Up, Pull_Down); -- Resistor subtype GPIO_Mode is Capability range Unknown_Mode .. Output; -- Possible modes for a GPIO point. Unknown_Mode means that the point -- is configured in a mode that is not described in this interface. For -- instance alternate function mode on an STM32 micro-controller. subtype GPIO_Config_Mode is GPIO_Mode range Input .. Output; -- Modes a GPIO point can be configured in subtype GPIO_Pull_Resistor is Capability range Floating .. Pull_Down; type GPIO_Point is limited interface; type Any_GPIO_Point is access all GPIO_Point'Class; function Support (This : GPIO_Point; Capa : Capability) return Boolean is abstract; -- Return True if the GPIO_Point supports the given capability function Mode (This : GPIO_Point) return GPIO_Mode is abstract; -- Return the current mode of the GPIO_Point procedure Set_Mode (This : in out GPIO_Point; Mode : GPIO_Config_Mode) is abstract with Pre'Class => This.Support (Mode); -- Set the mode of the GPIO_Point, iff the mode is supported function Pull_Resistor (This : GPIO_Point) return GPIO_Pull_Resistor is abstract; -- Return the current pull resistor mode procedure Set_Pull_Resistor (This : in out GPIO_Point; Pull : GPIO_Pull_Resistor) is abstract with Pre'Class => This.Support (Pull); -- Set the pull resistor of the GPIO_Point, iff the pull mode is supported function Set (This : GPIO_Point) return Boolean is abstract; -- Read actual state of the GPIO_Point. -- -- So far all the GPIO supported by this library have the ability to read -- the state even when they are configured as output. -- For the output control procedures below, depending on configuration -- and/or other devices conected to the IO line, these procedures may have -- no actual effect on the line. For example trying to set the IO when -- another device is pulling the line to low. procedure Set (This : in out GPIO_Point) is abstract; procedure Clear (This : in out GPIO_Point) is abstract; procedure Toggle (This : in out GPIO_Point) is abstract with Pre'Class => This.Mode = Output; end HAL.GPIO;
hypech/hypech.github.io
Ada
2,664,708
ads
!FILE_FORMAT=ADS !VERSION=1.0 !Section=Dimensions 'Name|DimensionClass|DimensionAlias|DimDataStorage|DimTwoPassCalc|Plan1Density|Plan2Density|Plan3Density|WorkforceDensity|CapexDensity|AttributeDataType|EnumOrder1|EnumOrder2|EnumOrder3|EnumOrderWF|EnumOrderCapex|DimValidForPlan1|DimValidForPlan2|DimValidForPlan3|DimValidForWorkforce|DimValidForCapex|Plan1PerfOrder|Plan2PerfOrder|Plan3PerfOrder|WorkforcePerfOrder|CapexPerfOrder|MissingLabel|DisplayOrder|GridMissingLabelType|AutoGenId|SmartListLabel|StartValue|Increment BU_Reference|Attribute|BU_Reference||||||||Text|||||||||||||||||||||| Account|Account|Account|NeverShare||Dense|Dense|Dense||||2|0|0|||Y|N|N|N|N|0|1|1|1|1||||||| Client|Generic|Client|NeverShare||Sparse|Sparse|Sparse||||0|0|0|||Y|N|N|N|N|4|8|8|8|8||||||| Currency|Currency|Currency|NeverShare||Sparse|Sparse|Sparse||||0|0|0|||Y|N|N|N|N|8|6|6|6|6||||||| Detail|Generic|Detail|NeverShare||Sparse|Sparse|Sparse||||1|0|0|||Y|N|N|N|N|2|9|9|9|9||||||| Entity|Entity|Entity|NeverShare||Sparse|Sparse|Sparse||||0|0|0|||Y|N|N|N|N|3|7|7|7|7||||||| Period|Period|Period|NeverShare||Dense|Dense|Dense||||0|0|0|||Y|N|N|N|N|1|2|2|2|2||||||| Scenario|Scenario|Scenario|NeverShare||Sparse|Sparse|Sparse||||0|0|0|||Y|N|N|N|N|7|4|4|4|4||||||| Version|Version|Version|NeverShare||Sparse|Sparse|Sparse||||0|0|0|||Y|N|N|N|N|9|5|5|5|5||||||| Year|Year|Year|NeverShare||Sparse|Sparse|Sparse||||0|0|0|||Y|N|N|N|N|6|3|3|3|3||||||| Action_Corrections|SmartList|Action_Corrections|||||||||||||||||||||||||ID|DropDown|N|Action Corrections|| Action_New_Request|SmartList|Action_New_Request|||||||||||||||||||||||||ID|DropDown|N|Action New Request|| Action_New_Requests|SmartList|Action_New_Requests|||||||||||||||||||||||||ID|DropDown|N|Action New Requests|| Action_New_Requests_CRM|SmartList|Action_New_Requests_CRM|||||||||||||||||||||||||ID|DropDown|N|Action New Requests CRM|| Alias|Alias|Alias|||||||||||||||||||||||||||||| !Section=DimensionAssociations 'BaseDimension|Property|TargetDimension Account|Alias|Alias Client|Alias|Alias Client|BU_Reference|BU_Reference Currency|TriangulationCurrency|Currency Detail|Alias|Alias Entity|Alias|Alias Entity|Currency|Currency Period|Alias|Alias Scenario|Alias|Alias Scenario|StartPeriod|Period Scenario|EndPeriod|Period Scenario|StartYear|Year Scenario|EndYear|Year !Hierarchies=BU_Reference 'Parent|Child|DataStorage|IsPrimary|Alias=Default #root|Sectors_Att||Y| Sectors_Att|Financial_Services_Att||Y| Financial_Services_Att|Retail_Banking_Att||Y| Retail_Banking_Att|FBKG_Att||Y| Retail_Banking_Att|FBUS_Att||Y| Retail_Banking_Att|FODU_Att||Y| Retail_Banking_Att|FOFI_Att||Y| Financial_Services_Att|Commercial_and_Transaction_Att||Y| Commercial_and_Transaction_Att|FCTB_Att||Y| Commercial_and_Transaction_Att|FOPR_Att||Y| Financial_Services_Att|Insurance_Att||Y| Insurance_Att|FIAB_Att||Y| Insurance_Att|FILI_Att||Y| Insurance_Att|FIPC_Att||Y| Financial_Services_Att|Capital_Markets_Att||Y| Capital_Markets_Att|FFSB_Att||Y| Capital_Markets_Att|FOMS_Att||Y| Capital_Markets_Att|FFIS_Att||Y| Capital_Markets_Att|FFAM_Att||Y| Sectors_Att|Government_Att||Y| Government_Att|Central_and_Federal_Att||Y| Central_and_Federal_Att|GFAD_Att||Y| Central_and_Federal_Att|GFRE_Att||Y| Central_and_Federal_Att|GFJU_Att||Y| Central_and_Federal_Att|GEOD_Att||Y| Central_and_Federal_Att|GFHR_Att||Y| Government_Att|Provincial_and_Municipal_Att||Y| Provincial_and_Municipal_Att|GPAD_Att||Y| Provincial_and_Municipal_Att|GMAD_Att||Y| Government_Att|Space_Defense_and_Intelligence_Att||Y| Space_Defense_and_Intelligence_Att|GSIS_Att||Y| Space_Defense_and_Intelligence_Att|GSID_Att||Y| Space_Defense_and_Intelligence_Att|GSII_Att||Y| Sectors_Att|Health_Att||Y| Health_Att|HHHP_Att||Y| Health_Att|HHCP_Att||Y| Health_Att|HHLS_Att||Y| Health_Att|Government_Health_Att||Y| Government_Health_Att|HHFA_Att||Y| Government_Health_Att|HHPA_Att||Y| Sectors_Att|Utilities_Att||Y| Utilities_Att|TUES_Att||Y| Utilities_Att|TUWA_Att||Y| Utilities_Att|TUGA_Att||Y| Sectors_Att|Communications_Att||Y| Communications_Att|TTTE_Att||Y| Sectors_Att|Oil_and_Gas_Att||Y| Oil_and_Gas_Att|MMOG_Att||Y| Sectors_Att|Manufacturing_Att||Y| Manufacturing_Att|Natural_Resources_Att||Y| Natural_Resources_Att|MMME_Att||Y| Natural_Resources_Att|MMMI_Att||Y| Natural_Resources_Att|MMPP_Att||Y| Natural_Resources_Att|MMCH_Att||Y| Manufacturing_Att|Commercial_and_Industrial_Goods_Att||Y| Commercial_and_Industrial_Goods_Att|MMAS_Att||Y| Commercial_and_Industrial_Goods_Att|MMAU_Att||Y| Commercial_and_Industrial_Goods_Att|MMHT_Att||Y| Commercial_and_Industrial_Goods_Att|MMIP_Att||Y| Sectors_Att|Retail_and_Consumer_Services_Att||Y| Retail_and_Consumer_Services_Att|RRET_Att||Y| Retail_and_Consumer_Services_Att|RDWH_Att||Y| Retail_and_Consumer_Services_Att|RSER_Att||Y| Retail_and_Consumer_Services_Att|RCPG_Att||Y| Sectors_Att|Transportation_Att||Y| Transportation_Att|TPAV_Att||Y| Transportation_Att|TPMT_Att||Y| Transportation_Att|TPRL_Att||Y| Transportation_Att|TPRR_Att||Y| Sectors_Att|Post_and_Logistics_Att||Y| Post_and_Logistics_Att|PLPC_Att||Y| Post_and_Logistics_Att|PLLO_Att||Y| #root|No_Sectors_Att||Y| #root|To_be_Classified_Att||Y| !Hierarchies=Account 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|Plan1Aggregation|Plan2Aggregation|Plan3Aggregation|WorkforceAggregation|CapexAggregation|DataType|SourcePlanType|AccountType|ExchangeRateType|VarianceReporting|TimeBalance|SmartList|TwoPassCalc|SkipValue|Description|WeeksDistributionMember|Alias=Default|BSOMemberFormula #root|GL|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| GL|Balance_Sheet|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Balance Sheet| Balance_Sheet|10200000|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10200000 - 110 Accounts receivable| 10200000|10202000|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10202000 - Accounts receivable Trade (net of AFDA)| 10202000|10201000|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10201000 - Accounts Receivable - Trade| 10201000|10201010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10201010 - A/R Trade Control| 10201000|10201011|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10201011 - A/R Reclass to Deferred Rev| 10201000|10201012|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10201012 - A/R Trade adjustment GL| 10201000|10201013|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10201013 - A/R - Factoring| 10201000|10201014|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10201014 - A/R Clearing Account| 10202000|10201020|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10201020 - ST Fin.Lease Receivable-Dealer| 10202000|10221010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10221010 - Allowance-Doubtful Accounts| 10200000|10210000|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10210000 - Other Receivables| 10210000|10219010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10219010 - Miscellaneous Receivable| 10210000|10212010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10212010 - Memb Advances Payroll| 10210000|10212019|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10212019 - Impairment - Advances to Emplo| 10210000|10215010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10215010 - A/R Proceeds on Sale of Asset| 10210000|10216010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10216010 - A/R Tax Credit| 10210000|10216011|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10216011 - Sales Tax Receivable| 10210000|10216120|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10216120 - Discount Incentives| 10210000|10217010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10217010 - Fwd Contract Rec - realized - ST| 10210000|10217025|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10217025 - Share Swap Contract| 10210000|15249999|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|15249999 - Clearing Account| Balance_Sheet|10300000|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10300000 - 115 Work in progress| 10300000|10300000_Sub|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10300000_Sub - 10300000 without 10301030| 10300000_Sub|10301010|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10301010 - Work In Progress - GL| 10300000_Sub|10301011|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10301011 - WIP - Re class to Deferred Rev| 10300000_Sub|10301021|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10301021 - Accrued Income| 10300000_Sub|WIP_PCB|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP_PCB - Work in progress (PCB)| WIP_PCB|10301019|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10301019 - WIP Trade PCB| WIP_PCB|10301020|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10301020 - WIP Trade Adjustment PCB| 10300000|10301030|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|10301030 - WIP - Contract Withholding| Balance_Sheet|15101014|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|15101014 - A/R Trade External - LT| Balance_Sheet|15101015|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|15101015 - WIP Trade External - LT| Balance_Sheet|15101020|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|15101020 - LT Fin.Lease Receivable-Dealer| Balance_Sheet|20301000|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|20301000 - 215 Deferred revenue| Balance_Sheet|20301025|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|20301025 - Deferred Rev FV Cust.Contra ST| Balance_Sheet|25101500|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|25101500 - Long Term Deferred Revenue| Balance_Sheet|25101025|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|25101025 - Deferred Revenue LT| Balance_Sheet|25101035|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|25101035 - Deferred Rev FV Cust.Contra LT| GL|Income_Statement|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Income Statement| Income_Statement|Net_Rev|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Delivered Revenues| Income_Statement|Gross_Rev|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|REVENUES - Gross| Income_Statement|Ext_Rev|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|External Revenue| Income_Statement|Intra_Revenues|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||true|Revenues - Intra BU| Income_Statement|50101016|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|50101016 - Terminaton - Direct Salaries Cost Bill| Income_Statement|50101021|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|50101021 - Termination Accrual - Direct| Income_Statement|55201016|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|55201016 - Termination - Admin Support| Income_Statement|55201021|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Termination Accrual - Admin Support| Income_Statement|55101016|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|55101016 - Terminaton Administrator's Salaries| Income_Statement|55101021|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|55101021 - Termination Accrual - Admin Management| Income_Statement|55909916|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|55909916 - RnD Tax Credit| Income_Statement|55909917|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|55909917 - E-Commerce Tax Credit| #root|Statistical|LabelOnly|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Reporting Package| Statistical|Step1|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step1|Validation_AR|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Validation - AR| Validation_AR|AR_from_BU|DynamicCalc|Y|Y|N|N|||-|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AR from BU| AR_from_BU|AR_ST_from_BU|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AR ST from BU| AR_ST_from_BU|10201010|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_BU|10201011|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_BU|10201012|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_BU|10201013|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_BU|10201014|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_BU|10201020|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_from_BU|AR_LT_from_BU|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AR LT from BU| AR_LT_from_BU|15101014|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_LT_from_BU|15101020|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_from_BU|AR_AFDA_from_BU|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AFDA from BU| AR_AFDA_from_BU|10221010|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| Validation_AR|AR_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AR from GL| AR_from_GL|AR_ST_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AR ST from GL| AR_ST_from_GL|10201010|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_GL|10201011|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_GL|10201012|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_GL|10201013|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_GL|10201014|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_ST_from_GL|10201020|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_from_GL|AR_LT_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AR LT from GL| AR_LT_from_GL|15101014|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_LT_from_GL|15101020|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| AR_from_GL|AR_AFDA_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AFDA from GL| AR_AFDA_from_GL|10221010|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| Validation_AR|Valid_AR|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Validation AR|AR_from_GL -> Upload -> NA_Client - AR_from_BU -> Aging_Detail -> Client; Step1|Validation_WIP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Validation - WIP| Validation_WIP|WIP_from_BU|DynamicCalc|Y|Y|N|N|||-|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP from BU| WIP_from_BU|WIP_ST_from_BU|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP ST from BU| WIP_ST_from_BU|WIP_Trade_Total|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP Trade Total| WIP_ST_from_BU|10301011|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_ST_from_BU|10301010|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_from_BU|WIP_LT_from_BU|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP LT from BU| WIP_LT_from_BU|10301030|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_LT_from_BU|15101015|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| Validation_WIP|WIP_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP from GL| WIP_from_GL|WIP_ST_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP ST from GL| WIP_ST_from_GL|10301010|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_ST_from_GL|10301011|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_ST_from_GL|10301019|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_ST_from_GL|10301020|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_from_GL|WIP_LT_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP LT from GL| WIP_LT_from_GL|10301030|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| WIP_LT_from_GL|15101015|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| Validation_WIP|Valid_WIP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Validation WIP|WIP_from_GL -> Upload -> NA_Client - WIP_from_BU -> Aging_Detail -> Client; Step1|Validation_Def_Rev|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Validation - Deferred Revenue| Validation_Def_Rev|Def_Rev_from_BU|DynamicCalc|Y|Y|N|N|||-|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev from BU| Def_Rev_from_BU|Def_Rev_ST_from_BU|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev ST from BU| Def_Rev_ST_from_BU|Def_Rev_Short_Term|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev - Short-Term (Upload)|("20301000"-"20301025"); Def_Rev_ST_from_BU|Def_Rev_ST_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev - Short-Term Adj| Def_Rev_from_BU|Def_Rev_LT_from_BU|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev LT from BU| Def_Rev_LT_from_BU|Def_Rev_Long_Term|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev - Long-Term (Upload)|("25101500"-"25101035"); Def_Rev_LT_from_BU|Def_Rev_LT_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev - Long-Term Adj| Validation_Def_Rev|Def_Rev_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev from GL| Def_Rev_from_GL|Def_Rev_ST_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev ST from GL| Def_Rev_ST_from_GL|20301000|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| Def_Rev_ST_from_GL|20301025|ShareData|N|Y|N|N|||-|||||Currency||||||||||false|| Def_Rev_from_GL|Def_Rev_LT_from_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Def Rev LT from GL| Def_Rev_LT_from_GL|25101500|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| Def_Rev_LT_from_GL|25101035|ShareData|N|Y|N|N|||-|||||Currency||||||||||false|| Validation_Def_Rev|Valid_Def_Rev|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Validation Def Rev|Def_Rev_from_GL -> Upload -> NA_Client - Def_Rev_from_BU -> Aging_Detail -> Client; Step1|Data_Type|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Data Type| Data_Type|Manual_Input|NeverShare|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Manual Input or Reclass Allowed by BU| Data_Type|Upload_Data_Diver|NeverShare|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Uploaded Data by Client from Diver| Data_Type|Upload_Data_HFM|NeverShare|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Uploaded Data from HFM IFRS| Data_Type|No_BU_Adj|NeverShare|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|BU Adjustment is Not Allowed| Data_Type|Blank_or_Calculated|NeverShare|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Blank or Calculated in Hyperion| Statistical|Step2|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step2|Efficiency|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Efficiency Section| Efficiency|Available_Hours|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Available Hours (Payable Hours - Non-worked Hours)| Available_Hours|Payable_Hours|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Payable Hours from HRMS (4-4-5 basis)| Available_Hours|Non_Work_Hours|DynamicCalc|Y|Y|N|N|||-|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Non-worked Hours| Non_Work_Hours|Holidays|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Holidays/Floaters Hours| Non_Work_Hours|Vacation|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Vacation Hours| Non_Work_Hours|Compensated|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Compensated Hours| Non_Work_Hours|Leave|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Other Leave Hours| Non_Work_Hours|Sickness|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Sickness Hours| Efficiency|Internal_Hours|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Internal Hours| Internal_Hours|Sol_Product|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Sol. and Prod. Development Hours| Internal_Hours|Internal_Excl_Sol_Prod|DynamicCalc|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Internal Hours w/o Sol. and Prod. Development Hours| Internal_Excl_Sol_Prod|Training|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Training Hours| Internal_Excl_Sol_Prod|Bid_Proposal|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Bid and Proposal Marketing Hours| Internal_Excl_Sol_Prod|Other_Internal|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Other Internal Projects Hours| Internal_Excl_Sol_Prod|In_Between_Admin|DynamicCalc|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|In Between Assignment and Administration Hours| In_Between_Admin|In_Between|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|In Between Assigment Hours| In_Between_Admin|Administration|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Administration Hours| Efficiency|Internal_Hours_Corp|NeverShare|Y|Y|N|N|||+|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Internal Corporate Hours| Efficiency|Total_Client_Hours|DynamicCalc|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Client Hours| Total_Client_Hours|Billable_Client|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Billable Client Hours| Total_Client_Hours|NonBillable_Client|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Non-Billable Client Hours| Total_Client_Hours|Client_Hours|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Client Hours Adjustments (historical data)| Efficiency|Scheduled|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Scheduled Hours| Efficiency|TimeSheet|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Timesheet Hours| Efficiency|Ratios_Efficiency|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Ratios Efficiency| Ratios_Efficiency|Assignment|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Average||Y|||false|% Assignment (Client Hours / Available Hours)|IF (@ISMBR("Detail"))_ "Total_Client_Hours"/"Available_Hours";_ ENDIF; Ratios_Efficiency|Assignment_Billable|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Average||Y|||false|% Assignment Billable (Billable Client Hours / Available Hours)|IF (@ISMBR("Detail"))_ "Billable_Client"/"Available_Hours";_ ENDIF; Ratios_Efficiency|Assign_Sol_Prod|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Average||Y|||false|% Assignment with Sol. and Prod. Development Hours|IF (@ISMBR("Detail"))_ ("Total_Client_Hours"+"Sol_Product")/"Available_Hours";_ ENDIF; Ratios_Efficiency|Assign_Between_Adm|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Average||Y|||false|% Assignment In Between and Administration Hours|IF (@ISMBR("Detail"))_ "In_Between_Admin"/"Available_Hours";_ ENDIF; Ratios_Efficiency|Assign_Excl_Sol_Prod|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Average||Y|||false|% Assignment w/o Sol. and Prod. Development|IF (@ISMBR("Detail"))_ "Internal_Excl_Sol_Prod"/"Available_Hours";_ ENDIF; Ratios_Efficiency|Assignment_Corp|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Average||Y|||false|% Billable Assignment Corporate|IF (@ISMBR("Detail"))_ "Internal_Hours_Corp"/"Available_Hours";_ ENDIF; Statistical|Step3_4|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step3_4|AR_RP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Total A/R - Input| AR_RP|AR_Input|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R Total| AR_Input|AR_01_30|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R - 01-30 Days| AR_Input|AR_31_60|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R - 31-60 Days| AR_Input|AR_61_90|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R - 61-90 Days| AR_Input|AR_91_120|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R - 91-120 Days| AR_Input|AR_121_Over|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R - 121 Days and Over| AR_RP|AFDA_RP|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|AFDA| Step3_4|AR_LT_RP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R Long Term| AR_LT_RP|AR_LT_Input|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R Long Term (Input)| Statistical|Step5_6|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step5_6|WIP_RP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Total WIP - Input| WIP_RP|WIP_Input|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP Total| WIP_Input|Billing_In_Advance|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Billing in Advance| WIP_Input|WIP_01_30|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP - 01-30 Days| WIP_Input|WIP_31_60|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP - 31-60 Days| WIP_Input|WIP_61_90|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP - 61-90 Days| WIP_Input|WIP_91_120|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|WIP - 91-120 Days| WIP_Input|WIP_121_Over|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP - 121 Days and Over| WIP_RP|StartUpCost|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Start-up-cost - Marketing WIP (0.03)| Step5_6|10301030_Input|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|10301030 Input| Step5_6|WIP_LT_RP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|WIP Long Term| WIP_LT_RP|WIP_LT_Input|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP Long Term (Input)| Statistical|Step7|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step7|BL_Ext_Rev_Upload|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Consumption from GL|("Ext_Rev"); Step7|BL_Ext_Rev_Consumpt|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Consumption (Input)| Statistical|Step8|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step8|Revenue_by_Tier|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|| Statistical|Step9|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step9|Backlog|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Flow|||||false|Backlog Section| Backlog|BL_Ending_Calc|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Contract Ending Value| BL_Ending_Calc|BL_Beg|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Ending Value from previous month| BL_Ending_Calc|BL_Ending_Prev_Year|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Ending value from previous year| BL_Ending_Calc|BL_Activity|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Backlog Activity Variation| BL_Activity|BL_Consumption|DynamicCalc|Y|Y|N|N|||-|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Consumption| BL_Consumption|BL_Ext_Rev_Upload|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| BL_Consumption|BL_Ext_Rev_Consumpt|ShareData|N|Y|N|N|||+|||||Currency||||||||||false|| BL_Activity|BL_Bookings|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Bookings| BL_Bookings|BL_Bookings_New|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|New Bookings (Input)| BL_Bookings|BL_Bookings_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Bookings Adjustments (Input)| BL_Bookings|BL_Bookings_Details|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Backlog Bookings Details| BL_Bookings_Details|BL_Bookings_Types|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Backlog Bookings by Types| BL_Bookings_Types|BL_Bookings_New_Biz|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Bookings New Business| BL_Bookings_Types|BL_Bookings_Add_On|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Bookings Add-On| BL_Bookings_Types|BL_Bookings_Renew|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Bookings Renewal| BL_Bookings_Types|Valid_Bookings_Types|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Validation - Bookings Types to Allocate|"BL_Bookings_New"->"Detail"-"BL_Bookings_New_Biz"->"Adjustment"-"BL_Bookings_Add_On"->"Adjustment"-"BL_Bookings_Renew"->"Adjustment"; BL_Bookings_Details|BL_Bookings_Services|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Backlog Bookings by Services| BL_Bookings_Services|BL_Bookings_SIC|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Bookings SIC| BL_Bookings_Services|BL_Bookings_Out|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Bookings Outsourcing| BL_Bookings_Services|Valid_Bookings_Services|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Validation - Bookings Services to Allocate|"BL_Bookings_New"->"Detail"-"BL_Bookings_SIC"->"Adjustment"-"BL_Bookings_Out"->"Adjustment"; BL_Bookings_Details|BL_Bookings_Duration|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Backlog Bookings Duration| BL_Bookings_Duration|BL_Duration_SIC|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Bookings Duration SIC| BL_Bookings_Duration|BL_Duration_Out|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Bookings Duration Outsourcing| BL_Activity|BL_Backlog_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Backlog Adjustments (Input)| BL_Activity|BL_Backlog_Transfer|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Backlog Transfer (Input)| BL_Ending_Calc|BL_FX_Total|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Flow|||||false|FX Rate Variation Total| BL_FX_Total|BL_FX_Rate|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|FX Rate Var. Reporting| BL_FX_Total|BL_FX_Rate_BU|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Flow|||||false|FX Rate Var. Local vs Reporting Currency| BL_Ending_Calc|BL_Starting|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Contract Ending Value from External System| Backlog|BL_Ending|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Backlog Ending Value| Backlog|Twelve_Months_Increm_Rev|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Next 12 months incremental revenue from booking of the period| Backlog|BL_Projection|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Backlog Projection| BL_Projection|YR1|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 1| YR1|YR1_3M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 1 - 0 to 3 months| YR1|YR1_6M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 1 - 4 to 6 months| YR1|YR1_9M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 1 - 7 to 9 months| YR1|YR1_12M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 1 - 10 to 12 months| BL_Projection|YR2|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 2| YR2|YR2_3M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 2 - 13 to 15 months| YR2|YR2_6M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 2 - 16 to 18 months| YR2|YR2_9M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 2 - 19 to 21 months| YR2|YR2_12M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 2 - 22 to 24 months| BL_Projection|YR3|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 3 - 25 to 36 months| BL_Projection|YR4|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 4 - 37 to 48 months| BL_Projection|YR5|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 5 - 49 to 60 months| BL_Projection|YR6_Over|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|BL Projection - Year 6 and Over| Backlog|BU_Projection|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU Backlog Projection| BU_Projection|BU_Quarter0|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU BL Projection - Current Quarter| BU_Projection|BU_YR1|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU BL Projection - Year 1| BU_YR1|BU_Quarter1|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU BL Projection - Current Quarter + 1 Quarter| BU_YR1|BU_Quarter2|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU BL Projection - Current Quarter + 2 Quarter| BU_YR1|BU_Quarter3|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU BL Projection - Current Quarter + 3 Quarter| BU_YR1|BU_Quarter4|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU BL Projection - Current Quarter + 4 Quarter| BU_Projection|BU_Quarter_Over|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Fill|||||false|BU BL Projection - Current Quarter + Over 1 Year| Backlog|BL_Projection_Valid|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Backlog Projection Validation|"BL_Ending_Calc"-"BU_Projection"; Backlog|Bookings_Projection|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection| Bookings_Projection|YR1_Bookings|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 1| YR1_Bookings|YR1_Book_3M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 1 - 0 to 3 months| YR1_Bookings|YR1_Book_6M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 1 - 4 to 6 months| YR1_Bookings|YR1_Book_9M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 1 - 7 to 9 months| YR1_Bookings|YR1_Book_12M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 1 - 10 to 12 months| Bookings_Projection|YR2_Bookings|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 2| YR2_Bookings|YR2_Book_3M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 2 - 13 to 15 months| YR2_Bookings|YR2_Book_6M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 2 - 16 to 18 months| YR2_Bookings|YR2_Book_9M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 2 - 19 to 21 months| YR2_Bookings|YR2_Book_12M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 2 - 22 to 24 months| Bookings_Projection|YR3_Bookings|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 3 - 25 to 36 months| Bookings_Projection|YR4_Bookings|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 4 - 37 to 48 months| Bookings_Projection|YR5_Bookings|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 5 - 49 to 60 months| Bookings_Projection|YR6_Over_Bookings|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|Bookings Projection - Year 6 and Over| Backlog|BU_Book_Projection|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection| BU_Book_Projection|BU_Book_YR1|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 1| BU_Book_YR1|BU_Book_YR1_3M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 1 - 0 to 3 months| BU_Book_YR1|BU_Book_YR1_6M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 1 - 4 to 6 months| BU_Book_YR1|BU_Book_YR1_9M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 1 - 7 to 9 months| BU_Book_YR1|BU_Book_YR1_12M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 1 - 10 to 12 months| BU_Book_Projection|BU_Book_YR2|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 2| BU_Book_YR2|BU_Book_YR2_3M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 2 - 13 to 15 months| BU_Book_YR2|BU_Book_YR2_6M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 2 - 16 to 18 months| BU_Book_YR2|BU_Book_YR2_9M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 2 - 19 to 21 months| BU_Book_YR2|BU_Book_YR2_12M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 2 - 22 to 24 months| BU_Book_Projection|BU_Book_YR3|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 3 - 25 to 36 months| BU_Book_Projection|BU_Book_YR4|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 4 - 37 to 48 months| BU_Book_Projection|BU_Book_YR5|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 5 - 49 to 60 months| BU_Book_Projection|BU_Book_YR6_Over|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Balance|||||false|BU Bookings Projection - Year 6 and Over| Backlog|Timelines|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Time lines| Timelines|Beg_Day|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Begin Date| Timelines|Beg_Month|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Begin Month| Timelines|Beg_Year|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Begin Year| Timelines|End_Day|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Ending Day| Timelines|End_Month|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Ending Month| Timelines|End_Year|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance|||||false|Ending Year| Timelines|Beg_Date|NeverShare|Y|Y|N|N|||~|||||Date|Plan1|SavedAssumption|None|NonExpense|Fill|||||true|Beginning date of contract| Timelines|End_Date|NeverShare|Y|Y|N|N|||+|||||Date|Plan1|SavedAssumption|None|NonExpense|Fill|||||true|Ending date of contract| Timelines|Contract_Duration|DynamicCalc|Y|Y|N|N|||+|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance||Y|||false|Contract Duration|IF (("End_Date" <> #MISSING)AND ("Beg_Date" <> #MISSING))_ (@INT("End_Date"/10000) - @INT("Beg_Date"/10000)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(@MOD("Beg_Date", 10000)/100));_ ENDIF; Timelines|Contract_Remaining|DynamicCalc|Y|Y|N|N|||+|||||NonCurrency|Plan1|Asset|None|NonExpense|Balance||Y|||false|Contract Remaining (in Months)|IF("End_Date"<>#MISSING)_ IF (@ISMBR("Oct"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(10)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(10)) ;_ ENDIF;_ ELSEIF (@ISMBR("Nov"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(11)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(11)) ;_ ENDIF;_ ELSEIF (@ISMBR("Dec"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(12)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(12)) ;_ ENDIF;_ ELSEIF (@ISMBR("Jan"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(1)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(1)) ;_ ENDIF;_ ELSEIF (@ISMBR("Feb"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(2)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(2)) ;_ ENDIF;_ ELSEIF (@ISMBR("Mar"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(3)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(3)) ;_ ENDIF;_ ELSEIF (@ISMBR("Apr"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(4)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(4)) ;_ ENDIF;_ ELSEIF (@ISMBR("May"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(5)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(5)) ;_ ENDIF;_ ELSEIF (@ISMBR("Jun"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(6)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(6)) ;_ ENDIF;_ ELSEIF (@ISMBR("Jul"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(7)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(7)) ;_ ENDIF;_ ELSEIF (@ISMBR("Aug"))_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(8)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(8)) ;_ ENDIF;_ ELSE_ IF ((@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(9)) > 0)_ (@INT("End_Date"/10000) - @INT(&CURYRVAL)) * 12 + (@INT(@MOD("End_Date", 10000)/100) - @INT(9)) ;_ ENDIF;_ ENDIF_ ENDIF Backlog|BL_FX_Temp|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Flow|||||false|FX Rate Variation Impact Value (Temp)| Backlog|BL_FX_Total_Temp|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Flow|||||false|| Backlog|Weight_Duration_BU|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|Asset|None|NonExpense|Balance||Y|||false|Weight Duration at BU level| Backlog|Weight_Duration_SBU|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|Asset|None|NonExpense|Balance||Y|||false|Weight Duration at parent BU level| Backlog|Weight_Duration_HWG|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|Asset|None|NonExpense|Balance||Y|||false|Weight Duration at HWG level| Backlog|Book_to_Bill_Ratio|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Flow||Y|||false|% Bookings to Bill Ratio|IF(@ISMBR("Detail"))_ "BL_Bookings" / "BL_Ext_Rev_Consumpt";_ ENDIF; Backlog|In_Year_Booking|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Backlog Bookings In Year| Statistical|Step10_11|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step10_11|Def_Rev_RP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Liability|Ending|NonExpense|Balance||Y|||false|Deferred Revenue ST| Def_Rev_RP|Def_Rev_Input|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Deferred Revenue ST (Input)| Def_Rev_Input|Def_Rev_01_30|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Deferred Revenue 01-30 Days| Def_Rev_Input|Def_Rev_31_60|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Deferred Revenue 31-60 Days| Def_Rev_Input|Def_Rev_61_90|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Deferred Revenue 61-90 Days| Def_Rev_Input|Def_Rev_91_Over|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Deferred Revenue 91 Days and Over| Step10_11|Def_Rev_LT_RP|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Liability|Ending|NonExpense|Balance||Y|||false|Deferred Revenue Long Term| Def_Rev_LT_RP|Def_Rev_LT_Input|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||false|Deferred Revenue Long Term (Input)| Statistical|Step12|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step12|Severance|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Severance Total| Severance|Severance_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Severance from GL| Severance_GL|Direct_Sev_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Direct Severance from GL|("50101016"+"50101021"); Severance_GL|Admin_Sev_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Admin Severance from GL|("55101016"+"55101021"); Severance_GL|Admin_Support_Sev_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Admin Support Severance from GL|("55201016"+"55201021"); Severance|Severance_RP|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Severance from BU| Severance_RP|Direct_Sev_RP|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Direct Severance (Input)| Severance_RP|Admin_Sev_RP|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Admin Severance (Input)| Severance_RP|Admin_Support_Sev_RP|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Admin. Support Severance (Input)| Severance|Nb_Severed_People|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Nb. of Severed People| Statistical|Step13|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step13|Integration_Cost_Total|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Integration Cost Total| Integration_Cost_Total|HWG-01 Finance & Taxation|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-02 Treasury & SOX|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-03 Real Estate|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-04 Spend Management|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-05 CIO - IS/IT|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-06 Human Resources|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-07 EAS|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-08 Internal Audit|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-09 Legal & Insurance|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-10 Client Approach|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-11 Investors Relation & Communication|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-12 Public Company Costs|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Integration_Cost_Total|HWG-13 Operations|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Statistical|Step14|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step14|PPP_Accounts|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|| PPP_Accounts|YTD_Provision_Balance|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|YTD Provision Balance (B/S)| PPP_Accounts|Fcst_Provision_Balance_As_at_Sep|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|Forecast Provision Balance as at Sep (B/S)| PPP_Accounts|PPP_Description|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|PPP Description| PPP_Accounts|%_Assumption_of_PPP_achievement|NeverShare|Y|Y|N|N|||~|||||Percentage|Plan1|Asset|None|NonExpense|Balance|||||false|% Assumption of PPP achievement for the calculation of Fringes| Statistical|Step15|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step15|DSO_Items|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Flow|||||false|DSO Section| DSO_Items|Net_Asset|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Flow||Y|||false|Net Asset - GL| Net_Asset|Net_Asset_charge|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Flow||Y|||false|| Net_Asset_charge|AR_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Total A/R (from GL)| AR_GL|AR_GL_Upload|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R - Upload (from GL)| AR_GL_Upload|AR_GL_Sub_Upload|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R - Sub-Upload (from GL)|("10201010"+"10201011"+"10201012"+"10201014"); AR_GL_Upload|AR_GL_Factoring|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|A/R - Factoring (from GL)|"10201013"; AR_GL_Upload|AR_GL_ST_Lease_Dealer|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R - Fin. Lease Dealer (ST)|"10201020"; AR_GL|AFDA_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R - AFDA (from GL)|"10221010"; Net_Asset_charge|WIP_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Total WIP (from GL)| WIP_GL|WIP_GL_Upload|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|WIP - Upload (from GL)|"10300000_Sub"; WIP_GL|10301030_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|10301030 From GL|"10301030"; Net_Asset_charge|AR_LT_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R Long Term (from GL)|("15101014"+"15101020"); Net_Asset_charge|WIP_LT_GL|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||false|WIP Long Term (from GL)|"15101015"; Net_Asset|Def_Rev_GL|DynamicCalc|Y|Y|N|N|||-|||||Currency|Plan1|Liability|Ending|NonExpense|Balance||Y|||false|Deferred Revenue ST (from GL)|("20301000"-"20301025"); Net_Asset|Def_Rev_LT_GL|DynamicCalc|Y|Y|N|N|||-|||||Currency|Plan1|Liability|Ending|NonExpense|Balance||Y|||false|Deferred Revenue Long Term (from GL)|("25101500"-"25101035"); Net_Asset|AR_GL_LT_Lease_Dealer|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R - Fin. Lease Dealer (LT)|"15101020"; DSO_Items|DSO_Ratios|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance|||||false|DSO Items Ratios| DSO_Ratios|AR_01_30_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|AR 01-30 Days Ratio| DSO_Ratios|AR_31_60_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|AR 31-60 Days Ratio| DSO_Ratios|AR_61_90_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|AR 61-90 Days Ratio| DSO_Ratios|AR_91_120_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|AR 91-120 Days Ratio| DSO_Ratios|AR_121_Over_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|AR 121 Days and Over Ratio| DSO_Ratios|WIP_01_30_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|WIP 01-30 Days Ratio| DSO_Ratios|WIP_31_60_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|WIP 31-60 Days Ratio| DSO_Ratios|WIP_61_90_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|WIP 61-90 Days Ratio| DSO_Ratios|WIP_91_120_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|WIP 91-120 Days Ratio| DSO_Ratios|WIP_121_Over_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|WIP 121 Days and Over Ratio| DSO_Ratios|Def_Rev_01_30_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|Deferred Revenues 01-30 Days Ratio| DSO_Ratios|Def_Rev_31_60_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|Deferred Revenues 31-60 Days Ratio| DSO_Ratios|Def_Rev_61_90_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|Deferred Revenues 61-90 Days Ratio| DSO_Ratios|Def_Rev_91_Over_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|Deferred Revenues 91 Days and Over Ratio| DSO_Ratios|AFDA_Ratio|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Balance||Y|||false|AFDA Ratio| DSO_Items|BL_Ext_Rev_L3M|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Last 3 months Total Revenues|IF(@ISMBR("Detail"))_ IF (@ISMBR("Actual"))_ IF (@ISMBR("Oct"))_ "BL_Ext_Rev_Upload"+@MDSHIFT("BL_Ext_Rev_Upload",-1,Year,,10,"Period",)+@MDSHIFT("BL_Ext_Rev_Upload",-1,Year,,11,"Period",);_ ELSEIF (@ISMBR("Nov"))_ "BL_Ext_Rev_Upload"+@MDSHIFT("BL_Ext_Rev_Upload",-1,Year,,10,"Period",)+@MDSHIFT("BL_Ext_Rev_Upload",-1,"Period",);_ ELSE_ "BL_Ext_Rev_Upload"+@MDSHIFT("BL_Ext_Rev_Upload",-2,"Period",)+@MDSHIFT("BL_Ext_Rev_Upload",-1,"Period",);_ ENDIF;_ ELSEIF(@ISMBR("YoY"))_ "Actual"->"BL_Ext_Rev_L3M" - @MDSHIFT("BL_Ext_Rev_L3M",-1,"Year",,0,"Actual",);_ ELSEIF(@ISMBR("MoM"))_ IF (@ISMBR("Oct"))_ "Actual"-> "BL_Ext_Rev_L3M" - @MDSHIFT("BL_Ext_Rev_L3M",-1,"Year",,11,"Period",,0,"Actual",);_ ELSE_ "Actual"->"BL_Ext_Rev_L3M" - @MDSHIFT("BL_Ext_Rev_L3M",-1,"Period",,0,"Actual",);_ ENDIF;_ ENDIF; DSO_Items|BL_Ext_Rev_L3M_90|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||true|Last 3 months Total Revenue divided by 90|IF(@ISMBR("Detail"))_ IF (@ISMBR("Actual"))_ "BL_Ext_Rev_L3M"/90;_ ENDIF;_ ENDIF; DSO_Items|DSO|DynamicCalc|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow||Y|||false|DSO - Days of Outstanding Sales|IF(@ISMBR("Actual") AND @ISMBR("Detail"))_ "Net_Asset"/("BL_Ext_Rev_L3M"/90); Step15|DSO_Statistic_Account|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|Asset|None|NonExpense|Flow|||||true|DSO Statistic Account| DSO_Statistic_Account|DSO_Net_Asset|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|DSO Net Asset - GL| DSO_Net_Asset|DSO_AR_GL|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|DSO AR (from GL)| DSO_Net_Asset|DSO_AR_BEF_FACT_LEASE_GL|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|DSO AR bef. AR Fact. & ST Lease (from GL)| DSO_Net_Asset|DSO_AR_FACT_GL|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|AR Factoring (from GL)| DSO_Net_Asset|DSO_AR_ST_LEASE_GL|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|Financial Lease Rec. Dealer - Short Term (from GL)| DSO_Net_Asset|DSO_AR_LT_GL|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|DSO AR Long Term (from GL)| DSO_Net_Asset|DSO_WIP_GL|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|DSO WIP(from GL)| DSO_Net_Asset|DSO_WIP_LT_GL|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|DSO WIP Long Term (fromGL)| DSO_Net_Asset|DSO_Def_Rev_GL|NeverShare|Y|Y|N|N|||-|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||true|DSO Deferred Revenue (from GL)| DSO_Net_Asset|DSO_Def_Rev_LT_GL|NeverShare|Y|Y|N|N|||-|||||Currency|Plan1|Liability|Ending|NonExpense|Balance|||||true|DSO Deferred Revenue Long Term (from GL)| DSO_Net_Asset|DSO_AR_LT_LEASE_GL|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|Financial Lease Rec. Dealer - Long Term (from GL)| Step15|DSO_BL_EXT_Rev_L3M|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||true|DSO Last 3 Months Total Revenues| Step15|DSO_BL_EXT_Rev_L3M_90|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||true|DSO Last 3 Months Total Revenue Divided by 90| Step15|DSO_Never_Shared|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||true|Days Sale Outstanding| Statistical|Step16|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step16|BL_Top_Backlog|LabelOnly|Y|Y|N|N|||+|||||NonCurrency|Plan1|Asset|None|NonExpense|Flow|||||false|Top Backlog Accounts| BL_Top_Backlog|BL_Cons_Avg_6M|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|6 Mth Basis Analysis - Average Consumption|IF (@ISMBR("Oct")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Year",,11,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,10,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,9,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)) / 6;_ _ ELSEIF (@ISMBR("Nov")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,10,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,9,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)) / 6;_ _ ELSEIF (@ISMBR("Dec")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,9,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)) / 6;_ _ ELSEIF (@ISMBR("Jan")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)) / 6;_ _ ELSEIF (@ISMBR("Feb")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)) / 6;_ _ ELSE_ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)) / 6;_ _ ENDIF; BL_Top_Backlog|BL_Estimate_6M|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|6 Mth Basis Analysis - Backlog Estimate|"BL_Cons_Avg_6M" * "Contract_Remaining"; BL_Top_Backlog|BL_Over_Under_6M|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|6 Mth Basis Analysis - Over/(Under) Statement of the Backlog|"BL_Ending" - "BL_Estimate_6M"; BL_Top_Backlog|BL_Pct_Backlog_6M|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|Revenue|None|NonExpense|Flow||Y|||false|6 Mth Basis Analysis - Over/(Under) Statement of the Backlog (%)|"BL_Over_Under_6M" / "BL_Ending"; BL_Top_Backlog|BL_Pct_6M_Text|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|Revenue|None|NonExpense|Balance|||||false|6 Mth Basis Analysis - Variance Explanation| BL_Top_Backlog|BL_Cons_Avg_12M|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|12 Mth Basis Analysis - Average Consumption|IF (@ISMBR("Oct")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Year",,11,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,10,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,9,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,6,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Nov")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,10,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,9,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,6,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Dec")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,9,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,6,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Jan")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,6,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Feb")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,7,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,6,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Mar")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,6,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Apr")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)+_ @MDSHIFT("BL_Consumption",-6,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,5,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("May")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)+_ @MDSHIFT("BL_Consumption",-6,"Period",)+_ @MDSHIFT("BL_Consumption",-7,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,4,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Jun")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)+_ @MDSHIFT("BL_Consumption",-6,"Period",)+_ @MDSHIFT("BL_Consumption",-7,"Period",)+_ @MDSHIFT("BL_Consumption",-8,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,3,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Jul")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)+_ @MDSHIFT("BL_Consumption",-6,"Period",)+_ @MDSHIFT("BL_Consumption",-7,"Period",)+_ @MDSHIFT("BL_Consumption",-8,"Period",)+_ @MDSHIFT("BL_Consumption",-9,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,2,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSEIF (@ISMBR("Aug")) _ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)+_ @MDSHIFT("BL_Consumption",-6,"Period",)+_ @MDSHIFT("BL_Consumption",-7,"Period",)+_ @MDSHIFT("BL_Consumption",-8,"Period",)+_ @MDSHIFT("BL_Consumption",-9,"Period",)+_ @MDSHIFT("BL_Consumption",-10,"Period",)+_ @MDSHIFT("BL_Consumption",-1,"Year",,1,"Period",)) / 12;_ _ ELSE /* Sep */_ ("BL_Consumption"+_ @MDSHIFT("BL_Consumption",-1,"Period",)+_ @MDSHIFT("BL_Consumption",-2,"Period",)+_ @MDSHIFT("BL_Consumption",-3,"Period",)+_ @MDSHIFT("BL_Consumption",-4,"Period",)+_ @MDSHIFT("BL_Consumption",-5,"Period",)+_ @MDSHIFT("BL_Consumption",-6,"Period",)+_ @MDSHIFT("BL_Consumption",-7,"Period",)+_ @MDSHIFT("BL_Consumption",-8,"Period",)+_ @MDSHIFT("BL_Consumption",-9,"Period",)+_ @MDSHIFT("BL_Consumption",-10,"Period",)+_ @MDSHIFT("BL_Consumption",-11,"Period",)) / 12;_ _ ENDIF; BL_Top_Backlog|BL_Estimate_12M|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|12 Mth Basis Analysis - Backlog Estimate|"BL_Cons_Avg_12M" * "Contract_Remaining"; BL_Top_Backlog|BL_Over_Under_12M|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|12 Mth Basis Analysis - Over/(Under) Statement of the Backlog|"BL_Ending" - "BL_Estimate_12M"; BL_Top_Backlog|BL_Pct_Backlog_12M|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|Revenue|None|NonExpense|Flow||Y|||false|12 Mth Basis Analysis - Over/(Under) Statement of the Backlog (%)|"BL_Over_Under_12M" / "BL_Ending"; BL_Top_Backlog|BL_Pct_12M_Text|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|Revenue|None|NonExpense|Balance|||||false|12 Mth Basis Analysis - Variance Explanation| BL_Top_Backlog|BL_Consump_Forecasted|NeverShare|Y|Y|N|N|||+|||||Unspecified|Plan1|Revenue|None|NonExpense|Flow|||||false|Consumption Forecasted| BL_Top_Backlog|BL_Mth_Remaining|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|Revenue|None|NonExpense|Balance|||||false|Months Remaining (Annual View)| BL_Top_Backlog|BL_Mth_Avg_Future_Cons|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Monthly Average Future Consumption|"BL_Consump_Forecasted" / "BL_Mth_Remaining"; BL_Top_Backlog|BL_Mth_Avg_Future_Text|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|Revenue|None|NonExpense|Balance|||||false|Monthly Avg Future Cons. Explanations| BL_Top_Backlog|BL_Estimate_Future_Cons|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Future Consumption Estimate - Backlog Estimate|"BL_Consump_Forecasted"; BL_Top_Backlog|BL_Over_Under_Future|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Future Consumption Estimate - Over/(Under) Statement of the Backlog|"BL_Ending" - "BL_Estimate_Future_Cons"; BL_Top_Backlog|BL_Pct_Backlog_Future|DynamicCalc|Y|Y|N|N|||+|||||Percentage|Plan1|Revenue|None|NonExpense|Flow||Y|||false|Future Consumption Estimate - Over/(Under) Statement of the Backlog (%)|"BL_Over_Under_Future" / "BL_Ending"; BL_Top_Backlog|BL_Pct_Future_Text|NeverShare|Y|Y|N|N|||+|||||NonCurrency|Plan1|Revenue|None|NonExpense|Balance|||||false|Future Consumption Estimate - Variance Explanation| BL_Top_Backlog|BL_Mth_Remaining_Var|DynamicCalc|Y|Y|N|N|||+|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow||Y|||true|Month Remaining Variance|IF(@ISMBR("Detail"))_ "Contract_Remaining" - "BL_Mth_Remaining";_ ENDIF; Statistical|Step17|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|| Step17|Fixed_Assets|LabelOnly|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Fixed Assets| Fixed_Assets|Total_AM|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Top Total Capitalized Investments| Total_AM|Tot_CustRelationship|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Total Customer Relationship| Total_AM|Total_Sub_AM|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Total Capitalized Investment| Total_Sub_AM|TotalFA|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Total Fixed Assets Capitalized| TotalFA|Land_Buildings|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Buildings & Land| Land_Buildings|Land|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|| Land_Buildings|Buildings|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|| TotalFA|Leasehold|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Leasehold Improvements| TotalFA|Furn_Equip_Fix|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Furniture, Office Equip. & Fixtures| TotalFA|Computers|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Computer Equipment| Total_Sub_AM|Total_Intg|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Total Intangibles Capitalized| Total_Intg|Business_Solution|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Business Solutions (IP)| Total_Intg|Internal_Software|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Internal Software| Total_Intg|Tot_SWLicense|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Software Licenses| Total_Sub_AM|Total_CC|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Average|NonExpense|Flow|||||false|Total Contract Costs Capitalized| Statistical|Step18_Tax_Credit_Program|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|Revenue|None|NonExpense|Flow|||||false|| Step18_Tax_Credit_Program|10216010_Var_vs_LY|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Average|NonExpense|Balance||Y|||false|AR Tax Credit Variance - Cur. Mth vs LY Ending|IF (@ISMBR(Dec) AND @ISMBR(Adjustment)) _ ("10216010_GL"->"Upload"- _ @MDSHIFT("10216010_GL"->"Upload",-1,Year,,9,Period,)-_ "10216010"->"Tax_Credit_Movement");_ _ ELSEIF (@ISMBR(Mar) AND @ISMBR(Adjustment)) _ ("10216010_GL"->"Upload"- _ @MDSHIFT("10216010_GL"->"Upload",-1,Year,,6,Period,)-_ "10216010"->"Tax_Credit_Movement");_ _ ELSEIF (@ISMBR(Jun) AND @ISMBR(Adjustment)) _ ("10216010_GL"->"Upload"- _ @MDSHIFT("10216010_GL"->"Upload",-1,Year,,3,Period,)-_ "10216010"->"Tax_Credit_Movement");_ _ ELSEIF (@ISMBR(Sep) AND @ISMBR(Adjustment)) _ ("10216010_GL"->"Upload"- _ @MDSHIFT("10216010_GL"->"Upload",-1,Year,,0,Period,)-_ "10216010"->"Tax_Credit_Movement");_ ENDIF; Step18_Tax_Credit_Program|55909916_Expl_Var|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow||Y|||false|RnD Tax Credit - Variance Explanation vs GL|IF (@ISMBR(Adjustment))_ ("55909916_GL"->"Upload"- _ "55909916"->"Tax_Credit_Movement");_ ENDIF; Step18_Tax_Credit_Program|55909917_Expl_Var|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow||Y|||false|E-Commerce Tax Credit - Variance Explanation vs GL|IF (@ISMBR(Adjustment))_ ("55909917_GL"->"Upload"- _ "55909917"->"Tax_Credit_Movement");_ ENDIF; Step18_Tax_Credit_Program|10216010_GL|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|A/R Tax Credit (GL)|"10216010"; Step18_Tax_Credit_Program|55909916_GL|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow||Y|||false|RnD Tax Credit (GL)|"55909916"; Step18_Tax_Credit_Program|55909917_GL|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow||Y|||false|E-Commerce Tax Credit (GL)|"55909917"; Statistical|Step19_Vacation_Impact|LabelOnly|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|| Step19_Vacation_Impact|Sequentially_Impact|LabelOnly|Y|Y|N|N|||~|||||Unspecified|Plan1|Expense|None|Expense|Flow|||||false|Sequentially Impact| Sequentially_Impact|SI_Vacation_Impact_Rev|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Seq. Impact - Vacation Impact over Revenue| Sequentially_Impact|SI_Vacation_Impact_NIBT|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Seq. Impact - Vacation Impact over NIBT| Step19_Vacation_Impact|Year_Over_Year_Impact|LabelOnly|Y|Y|N|N|||~|||||Text|Plan1|Expense|None|Expense|Flow|||||false|Year-over-Year Impact| Year_Over_Year_Impact|YoY_Vacation_Impact_Rev|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|YoY Impact - Vacation Impact over Revenue| Year_Over_Year_Impact|YoY_Vacation_Impact_NIBT|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|YoY Impact - Vacation Impact over NIBT| Statistical|Step20_IP|LabelOnly|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|| Step20_IP|IP_External_Revenue|DynamicCalc|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|IP - External Revenue| IP_External_Revenue|IP_Ext_Rev_Regional|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|External Revenue - Regional| IP_External_Revenue|IP_Ext_Rev_Imported|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|External Revenue - Imported| Step20_IP|IP_Contribution|DynamicCalc|Y|Y|N|N|||~|||||Unspecified|Plan1|Revenue|None|NonExpense|Flow|||||false|IP - Contribution| IP_Contribution|IP_Contribution_Regional|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Contribution - Regional| IP_Contribution|IP_Contribution_Imported|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Contribution - Imported| Statistical|Step_Client_Budget|LabelOnly|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|| Step_Client_Budget|Client_Revenue|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Client Revenue| Step_Client_Budget|Client_Margin|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Client Margin| Step_Client_Budget|Client_Orders|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||false|Client Orders| Statistical|Mapping|NeverShare|Y|Y|N|N|||~|||||Text|Plan1|SavedAssumption|None|NonExpense|Fill|||||false|| Mapping|Mapping_PSA|NeverShare|Y|Y|N|N|||~|||||Text|Plan1|SavedAssumption|None|NonExpense|Fill|||||false|Mapping PSA| Mapping|Mapping_CRM|NeverShare|Y|Y|N|N|||~|||||Text|Plan1|SavedAssumption|None|NonExpense|Fill|||||false|Mapping CRM| Statistical|Comments_Section|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Comments Accounts| Comments_Section|AR_Collectibility|NeverShare|Y|Y|N|N|||~|||||Percentage|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|% Collectibility| Comments_Section|AR_Comment|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|AR Explanations (Why, When, How ?)| Comments_Section|AR_LT_Due_Date|NeverShare|Y|Y|N|N|||~|||||Date|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|A/R LT Due Date| Comments_Section|AR_LT_Comment|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|A/R LT Explanations (Why, When, How ?)| Comments_Section|WIP_Comment|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Explanations (Why not yet billed ?)| Comments_Section|WIP_LT_Due_Date|NeverShare|Y|Y|N|N|||~|||||Date|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|WIP LT Due Date| Comments_Section|WIP_LT_Comment|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Explanations (Terms of payment)| Comments_Section|VAC_SI_Comment|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|Seq. Impact Comments| Comments_Section|VAC_YoY_Comment|NeverShare|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||false|YoY Impact Comments| Statistical|Validation|LabelOnly|Y|Y|N|N|||~|||||NonCurrency|Plan1|SavedAssumption|None|NonExpense|Flow|||||true|Validation Accounts| Validation|Unallocated_10301030|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance|||||true|Must be equal to zero to balance (10301030)|"10301030_GL"-"10301030_Input"; Validation|Unalloc_Direct_Sev|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Must be equal to zero to balance (DS)|"Direct_Sev_GL"-"Direct_Sev_RP"; Validation|Unalloc_Admin_Sev|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Must be equal to zero to balance (AS)|"Admin_Sev_GL"-"Admin_Sev_RP"; Validation|Unalloc_Adm_Supp_Sev|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Must be equal to zero to balance (ASS)|"Admin_Support_Sev_GL"-"Admin_Support_Sev_RP"; Validation|Unallocated_AR_ST|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Must be equal to zero to balance (AR ST)|AR_ST_from_GL -> Upload -> NA_Client - AR_ST_from_BU -> Aging_Detail -> Client; Validation|Unallocated_AFDA|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Must be equal to zero to balance (AFDA)|AR_AFDA_from_GL -> Upload -> NA_Client - AR_AFDA_from_BU -> Aging_Detail -> Client; Validation|Unallocated_AR_LT|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Must be equal to zero to balance (AR LT)|AR_LT_from_GL -> Upload -> NA_Client - AR_LT_from_BU -> Aging_Detail -> Client; Validation|Unallocated_WIP_ST|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Must be equal to zero to balance (WIP ST)|WIP_ST_from_GL -> Upload -> NA_Client - WIP_ST_from_BU -> Aging_Detail -> Client; Validation|Unallocated_WIP_LT|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Asset|Ending|NonExpense|Balance||Y|||false|Must be equal to zero to balance (WIP LT)|WIP_LT_from_GL -> Upload -> NA_Client - WIP_LT_from_BU -> Aging_Detail -> Client; Validation|Unallocated_Def_Rev_LT|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance||Y|||false|Must be equal to zero to balance (DRev LT)|Def_Rev_LT_from_GL -> Upload -> NA_Client - Def_Rev_LT_from_BU -> Aging_Detail -> Client; Validation|Unallocated_Def_Rev_ST|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Liability|Ending|NonExpense|Balance||Y|||false|Must be equal to zero to balance (DRev ST)|Def_Rev_ST_from_GL -> Upload -> NA_Client - Def_Rev_ST_from_BU -> Aging_Detail -> Client; Validation|Unallocated_Rev|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Must be equal to zero to balance (Rev)|IF(@ISMBR("NA_Client"))_ "BL_Ext_Rev_Upload"->"NA_Client"-"BL_Ext_Rev_Consumpt"->"Client_by_Vertical";_ ENDIF; Validation|Unallocated_Tier|DynamicCalc|Y|Y|N|N|||+|||||Currency|Plan1|Revenue|Average|NonExpense|Flow||Y|||false|Must be equal to zero to balance (Tiers)|IF(@ISMBR("NA_Client"))_ "BL_Ext_Rev_Upload"->"NA_Client"-"BL_Ext_Rev_Consumpt"->"Tiers";_ ENDIF; Validation|In_Year_Booking_SIC|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||true|In Year Booking - SIC| Validation|In_Year_Booking_Out|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Revenue|Average|NonExpense|Flow|||||true|In Year Booking - Outsourcing| #root|Account_Sanity_Test|NeverShare|Y|Y|N|N|||~|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Account - Sanity Test| Account_Sanity_Test|Account_Sanity_Test_1|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Account - Sanity Test 1| Account_Sanity_Test|Account_Sanity_Test_2|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Account - Sanity Test 2| Account_Sanity_Test|Account_Sanity_Test_Result|NeverShare|Y|Y|N|N|||+|||||Currency|Plan1|Expense|Average|Expense|Flow|||||false|Account - Sanity Test Result| !Hierarchies=Client 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|Plan1Aggregation|Plan2Aggregation|Plan3Aggregation|WorkforceAggregation|CapexAggregation|DataType|SmartList|TwoPassCalc|BU_Reference|Alias=Default|Description|BSOMemberFormula #root|Client_by_Vertical|NeverShare|Y|Y|N|N|||~|||||Unspecified||||Total Clients by Vertical|| Client_by_Vertical|Sectors|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Clients by Sector|| Sectors|Financial_Services|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Financial Services|| Financial_Services|Retail_Banking|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Retail and Banking|| Retail_Banking|FBKG|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FBKG|C20148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20148_01 - Comerica|| FBKG|C20148_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20148_02 - Comerica|| FBKG|C20148_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20148_03 - Comerica|| FBKG|C20155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20155_01 - Compass Bank|| FBKG|C20155_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20155_02 - Compass Bank|| FBKG|C20155_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20155_03 - Compass Bank|| FBKG|C20155_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20155_04 - Compass Bank|| FBKG|C20176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20176_01 - CS CO-OP/Alterna Bank|| FBKG|C20177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20177_01 - CTC Bank of Canada|| FBKG|C20177_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20177_02 - CTC Bank of Canada|| FBKG|C20194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20194_01 - Discover Financial Services|| FBKG|C20194_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20194_02 - Discover Financial Services|| FBKG|C20194_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20194_03 - Discover Financial Services|| FBKG|C20225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20225_01 - Farm Credit Canada|| FBKG|C20235_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20235_02 - Fifth 3rd Bank|| FBKG|C20235_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20235_03 - Fifth 3rd Bank|| FBKG|C20235_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20235_04 - Fifth 3rd Bank|| FBKG|C20235_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20235_05 - Fifth 3rd Bank|| FBKG|C20241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20241_01 - First Citizen Bank|| FBKG|C20241_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20241_02 - First Citizen Bank and Trust|| FBKG|C20241_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20241_03 - First Citizens Bank|| FBKG|C20241_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20241_04 - First Citizens Bank|| FBKG|C20243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20243_01 - First National Bank of Omaha|| FBKG|C20243_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20243_02 - First National Bank of Omaha|| FBKG|C20243_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20243_03 - First National Bank of Omaha|| FBKG|C20267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20267_01 - Gestion VMD Inc.|| FBKG|C20303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20303_01 - Household Trust|| FBKG|C20303_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20303_02 - Household Trust|| FBKG|C20306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20306_01 - Huntington National Bank|| FBKG|C20306_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20306_02 - Huntington National Bank|| FBKG|C20306_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20306_03 - Huntington National Bank|| FBKG|C20349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20349_01 - Banque Laurentienne du Canada|| FBKG|C20349_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20349_02 - Banque Laurentienne du Canada|| FBKG|C20349_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20349_03 - Banque Laurentienne|| FBKG|C20363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20363_01 - M and I Marshall and Ilsley Bank|| FBKG|C20363_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20363_02 - M and I Marshall and Ilsley Bank|| FBKG|C20364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20364_01 - M and T Bank|| FBKG|C20364_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20364_02 - M and T Bank|| FBKG|C20364_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20364_03 - M and T Bank|| FBKG|C20395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20395_01 - MRS Trust Company|| FBKG|C20401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20401_01 - National City Bank|| FBKG|C20401_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20401_02 - National City Bank|| FBKG|C20401_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20401_03 - National City Bank|| FBKG|C20401_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20401_04 - National City Bank|| FBKG|C11106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C11106_01 - Bank of England|| FBKG|C11106_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C11106_02 - Bank of England|| FBKG|C11107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C11107_01 - Barclays Bank|| FBKG|C11144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C11144_01 - MULTICLIENT|| FBKG|C11164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C11164_01 - Svenska Handelsbanken AB|| FBKG|C11164_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C11164_02 - Svenska Handelsbanken AB|| FBKG|C20005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20005_01 - DGM Bank and Trust Inc.|| FBKG|C20007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20007_01 - ABN AMRO|| FBKG|C20007_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20007_02 - ABN AMRO|| FBKG|C20007_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20007_03 - ABN AMRO|| FBKG|C20035_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20035_02 - American Express|| FBKG|C20035_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20035_03 - American Express|| FBKG|C20035_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20035_04 - American Express|| FBKG|C20047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20047_01 - Analyse financiere et administration|| FBKG|C20047_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20047_02 - Analyse financiere et administration|| FBKG|C20068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20068_01 - Banco Popular of Puerto Rico|| FBKG|C20068_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20068_02 - Banco Popular of Puerto Rico|| FBKG|C20068_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20068_03 - Banco Popular of Puerto Rico|| FBKG|C20071_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20071_08 - Bank AlJazira|| FBKG|C20075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20075_01 - Bank of the West|| FBKG|C20075_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20075_03 - BancWest Corporation - Bank of the West|| FBKG|C20075_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20075_04 - BancWest Corporation - Bank of the West|| FBKG|C20075_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20075_05 - BancWest Corporation - Bank of the West|| FBKG|C20075_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20075_06 - Bank of the West|| FBKG|C20076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_01 - BNC - Banque Nationale du Canada|| FBKG|C20076_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_02 - BNC - Banque Nationale du Canada|| FBKG|C20076_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_03 - BNC - Banque Nationale du Canada|| FBKG|C20076_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_05 - BNC - Banque Nationale du Canada|| FBKG|C20076_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_06 - BNC - Banque Nationale du Canada|| FBKG|C20076_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_08 - BNC - Banque Nationale du Canada|| FBKG|C20076_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_09 - BNC - Banque Nationale du Canada|| FBKG|C20076_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_10 - BNC - Banque nationale du Canada|| FBKG|C20076_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_12 - BNC - Banque Nationale du Canada|| FBKG|C20076_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_13 - BNC - Banque Nationale du Canada (Master agreement)|| FBKG|C20076_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_14 - BNC - Banque Nationale du Canada (T1)|| FBKG|C20076_15|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_15 - BNC - Banque Nationale du Canada (T2)|| FBKG|C20076_16|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_16 - BNC - Banque Nationale du Canada (T3)|| FBKG|C20076_17|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_17 - BNC - Banque Nationale du Canada (Pr. Ress.)|| FBKG|C20076_18|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_18 - BNC - Banque Nationale du Canada (SEET1)|| FBKG|C20076_19|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_19 - BNC - Banque Nationale du Canada (SEET2)|| FBKG|C20076_20|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_20 - BNC - Banque Nationale du Canada (SEET3)|| FBKG|C20076_21|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_21 - BNC - Banque Nationale du Canada (Financement aux societes (SAGE))|| FBKG|C20076_22|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_22 - BNC - Banque Nationale du Canada (Strategie et relation d'affaires)|| FBKG|C20076_23|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_23 - BNC (Centre de perception et recouvrement)|| FBKG|C20076_25|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_25 - NBC - National Bank of Canada|| FBKG|C20076_26|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_26 - NBC - National Bank of Canada|| FBKG|C20076_27|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_27 - BNC - Banque Nationale du Canada|| FBKG|C20076_28|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_28 - BNC - Banque Nationale du Canada|| FBKG|C20076_29|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_29 - BNC - Banque Nationale du Canada|| FBKG|C20088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_01 - BNP Paribas (Canada)|| FBKG|C20088_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_02 - BNP Paribas (Canada)|| FBKG|C20088_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_03 - BNP Paribas|| FBKG|C20088_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_04 - BNP Paribas - Asset Management|| FBKG|C20088_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_05 - BNP Paribas|| FBKG|C20088_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_06 - BNP Paribas Real Estate Holding GmbH|| FBKG|C20088_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_07 - Arval|| FBKG|C20088_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20088_08 - BNP Paribas SA|| FBKG|C20091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20091_01 - Bradesco|| FBKG|C20091_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20091_02 - Bradesco|| FBKG|C20091_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20091_03 - Bradesco|| FBKG|C20093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20093_01 - Bridgewater Bank|| FBKG|C20107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20107_01 - Canadian Western Bank|| FBKG|C20107_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20107_02 - Canadian Western Bank|| FBKG|C20107_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20107_03 - Canadian Western Bank|| FBKG|C20131_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20131_02 - Chase Card Services|| FBKG|C20131_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20131_03 - Chase Card Services|| FBKG|C20131_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20131_04 - Chase Card Services|| FBKG|C20138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_01 - CitiBank|| FBKG|C20138_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_02 - CitiBank|| FBKG|C20138_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_03 - CitiBank|| FBKG|C20138_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_04 - CitiBank (Korea)|| FBKG|C20138_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_09 - CitiBank (Egypt)|| FBKG|C20138_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_10 - CitiBank (UAE)|| FBKG|C20138_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_11 - CitiBank|| FBKG|C20138_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_12 - Citibank Korea|| FBKG|C20138_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_13 - Citibank Singapore|| FBKG|C20138_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_14 - Citibank Singapore|| FBKG|C20138_15|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_15 - Citibank Singapore|| FBKG|C20138_16|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_16 - Citibank Espana|| FBKG|C20138_17|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_17 - Citibank Korea|| FBKG|C20138_19|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_19 - CitiBank N.A.|| FBKG|C20138_20|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20138_20 - CitiBank|| FBKG|C20139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20139_01 - CitiCorps Acceptance Corp.|| FBKG|C20139_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20139_02 - CitiCorp|| FBKG|C20139_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20139_03 - CitiCorp Student Loan|| FBKG|C20139_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20139_04 - CitiCorp Student Loan|| FBKG|C20140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20140_01 - CitiGroup Fund Services|| FBKG|C20707_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20707_03 - Bank of Ireland|| FBKG|C20715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20715_01 - United Overseas Bank Limited|| FBKG|C20715_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20715_02 - United Overseas Bank|| FBKG|C20715_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20715_03 - United Overseas Bank|| FBKG|C20720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20720_01 - HBOS Plc|| FBKG|C20721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20721_01 - Marlborough Stirling Life|| FBKG|C20724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20724_01 - FirstRand Bank Limited|| FBKG|C20729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20729_01 - National Bank - Payroll|| FBKG|C20759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20759_01 - Rothschild|| FBKG|C20764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20764_01 - Fiducie Desjardins|| FBKG|C20764_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20764_02 - Fiducie Desjardins|| FBKG|C20764_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20764_03 - Fiducie Desjardins|| FBKG|C20804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20804_01 - Banco Santander de Puerto Rico|| FBKG|C20804_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20804_02 - Banco Santander de Puerto Rico|| FBKG|C20808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20808_01 - Sallie Mae|| FBKG|C20808_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20808_02 - Sallie Mae|| FBKG|C20811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20811_01 - Wilbanks - Windows project|| FBKG|C20812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20812_01 - Abbey PLC|| FBKG|C20812_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20812_02 - Abbey PLC|| FBKG|C20812_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20812_03 - Abbey National Plc|| FBKG|C20813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20813_01 - Allied Irish Bank|| FBKG|C20813_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20813_02 - Allied Irish Bank|| FBKG|C20813_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20813_03 - Allied Irish Bank|| FBKG|C20826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20826_01 - Produban|| FBKG|C20826_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20826_02 - Produban|| FBKG|C20826_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20826_03 - Produban|| FBKG|C20826_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20826_04 - Produban|| FBKG|C20848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20848_01 - Laser UK|| FBKG|C20848_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20848_02 - Laser UK|| FBKG|C20849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20849_01 - Regions Bank|| FBKG|C20849_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20849_02 - Regions Bank|| FBKG|C20861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20861_01 - Otera Capital|| FBKG|C20861_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20861_02 - Otera Capital|| FBKG|C20865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20865_01 - Banque de France|| FBKG|C20865_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20865_02 - Banque de France|| FBKG|C20865_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20865_07 - Banque de France|| FBKG|C20865_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20865_08 - Banque de France|| FBKG|C20890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20890_01 - Wachovia Dealers Services Inc.|| FBKG|C21013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21013_01 - Bank of China (Hong Kong) Limited|| FBKG|C21014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21014_01 - Lloyds Banking Group Plc|| FBKG|C21014_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21014_02 - Lloyds Banking Group Plc|| FBKG|C21015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21015_01 - First Horizon National Corp|| FBKG|C21017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21017_01 - Bank of Canada|| FBKG|C21017_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21017_02 - Bank of Canada|| FBKG|C21025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21025_01 - First National Bank of South Africa|| FBKG|C21025_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21025_02 - First National Bank of South Africa|| FBKG|C21030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21030_01 - Banco Itau|| FBKG|C21030_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21030_02 - Banco Itau|| FBKG|C21037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21037_01 - Acadia Financial Services|| FBKG|C21039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21039_01 - AGF Trust Company|| FBKG|C21042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21042_01 - Effort Trust|| FBKG|C21129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21129_01 - Home Trust Company|| FBKG|C21139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21139_01 - Key Bank|| FBKG|C21139_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21139_02 - Key Bank|| FBKG|C21146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21146_01 - Santander Cards Limited|| FBKG|C21146_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21146_02 - Santander Cards Limited|| FBKG|C21146_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21146_03 - Santander Cards Limited|| FBKG|C21156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21156_01 - Dunfermline Building Society|| FBKG|C21157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21157_01 - First Tennessee Bank|| FBKG|C21157_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21157_02 - First Tennessee Bank|| FBKG|C21159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21159_01 - Halifax Bank of Scotland|| FBKG|C21159_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21159_02 - Halifax Bank of Scotland|| FBKG|C21173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21173_01 - Amarillo National Bank|| FBKG|C21789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21789_01 - Northern Rock Plc|| FBKG|C21789_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21789_02 - Northern Rock Plc|| FBKG|C21796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21796_01 - Members Trust (DMS)|| FBKG|C21796_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21796_02 - Members Trust|| FBKG|C21808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21808_01 - Targobank AG and Co. KGaA|| FBKG|C21815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21815_01 - BRE Bank|| FBKG|C21822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21822_01 - President's Choice Financial|| FBKG|C21830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21830_01 - Espirito Santo S.A.|| FBKG|C21834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21834_01 - Standard Bank South Africa|| FBKG|C21834_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21834_02 - Standard Bank South Africa|| FBKG|C21834_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21834_03 - Standard Bank South Africa|| FBKG|C21842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21842_01 - Citicorp Citibank|| FBKG|C21843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21843_01 - CitiFinancial|| FBKG|C21848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21848_01 - Canadian Tire Financial Services|| FBKG|C21852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21852_01 - MB Financial Bank|| FBKG|C21853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21853_01 - Anida desarrollos inmobiliarios S.L.|| FBKG|C21856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21856_01 - Country Financial|| FBKG|C20445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20445_01 - Peace Hills Trust|| FBKG|C20445_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20445_02 - Peace Hills Trust|| FBKG|C20445_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20445_03 - Peace Hills Trust|| FBKG|C20462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20462_01 - PNC Bank|| FBKG|C20462_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20462_02 - PNC Bank|| FBKG|C20462_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20462_03 - PNC Bank|| FBKG|C20462_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20462_04 - PNC Bank|| FBKG|C20462_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20462_05 - PNC Bank|| FBKG|C20462_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20462_06 - PNC Bank|| FBKG|C20539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20539_01 - Suntrust|| FBKG|C20539_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20539_02 - Suntrust|| FBKG|C20539_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20539_03 - Suntrust|| FBKG|C20539_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20539_04 - Suntrust|| FBKG|C20539_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20539_05 - SunTrust Bank|| FBKG|C20549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_01 - TD Bank|| FBKG|C20549_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_02 - TD Bank|| FBKG|C20549_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_03 - TD Bank|| FBKG|C20549_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_04 - TD Bank|| FBKG|C20549_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_05 - TD Bank|| FBKG|C20549_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_06 - TD Securities|| FBKG|C20549_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_09 - TD Bank|| FBKG|C20584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20584_01 - UMB Bank|| FBKG|C20584_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20584_02 - UMB Bank|| FBKG|C20584_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20584_03 - United Missouri Bank (UMB)|| FBKG|C20587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20587_01 - Union Bank|| FBKG|C20587_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20587_02 - Union Bank|| FBKG|C20587_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20587_03 - Union Bank ASP|| FBKG|C20587_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20587_04 - Union Bank|| FBKG|C20587_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20587_05 - Union Bank|| FBKG|C20587_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20587_06 - Union Bank of California|| FBKG|C20609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20609_01 - Wachovia, NB|| FBKG|C20609_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20609_02 - Wachovia, NB|| FBKG|C20609_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20609_03 - Wachovia, NB|| FBKG|C20609_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20609_04 - Wachovia, NB|| FBKG|C20615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20615_01 - Whitney National Bank|| FBKG|C20615_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20615_02 - Whitney National Bank|| FBKG|C20615_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20615_03 - Whitney National Bank|| FBKG|C20615_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20615_04 - Whitney National Bank|| FBKG|C20615_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20615_05 - Whitney National Bank|| FBKG|C20622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20622_01 - Your Neighbourhood Credit Union|| FBKG|C20622_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20622_02 - Your Neighbourhood Credit Union|| FBKG|C20623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20623_01 - Zions Bancorporation|| FBKG|C20623_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20623_02 - Zions Bancorporation|| FBKG|C20623_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20623_03 - Zions Bancorporation|| FBKG|C20627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20627_01 - ISBAN|| FBKG|C20627_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20627_02 - ISBAN DE|| FBKG|C20628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20628_01 - Confederacion Espanola de Cajas de Ahorr|| FBKG|C20630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20630_01 - BNL - Banca Nazionale del Lavoro|| FBKG|C20630_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20630_02 - BNL - Banca Nazionale del Lavoro|| FBKG|C20630_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20630_03 - BNL - Banca Nazionale del Lavoro|| FBKG|C20632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20632_01 - Montepio|| FBKG|C20640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20640_01 - Fiat Kredit Bank|| FBKG|C20640_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20640_02 - Fiat Kredit Bank|| FBKG|C20640_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20640_03 - Fiat Kredit Bank|| FBKG|C20640_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20640_04 - Fiat Kredit Bank|| FBKG|C20641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20641_01 - SEB|| FBKG|C20642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20642_01 - Bank Santander|| FBKG|C20647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20647_01 - BZ WBK|| FBKG|C20647_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20647_02 - BZ WBK|| FBKG|C20647_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20647_03 - BZ WBK|| FBKG|C20648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20648_01 - Bank BPH|| FBKG|C20648_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20648_02 - Bank BPH|| FBKG|C20648_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20648_03 - Bank BPH|| FBKG|C20649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20649_01 - BGZ Bank|| FBKG|C20650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_01 - SG - Société Générale|| FBKG|C20650_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_02 - SG - Société Générale|| FBKG|C20650_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_03 - SG - Societe Generale|| FBKG|C20650_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_04 - SG - Société Générale|| FBKG|C20650_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_05 - SG - Société Générale|| FBKG|C20650_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_07 - SG - Société Générale|| FBKG|C20650_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_08 - Société Générale|| FBKG|C20650_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20650_09 - SG - Société Générale|| FBKG|C20652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20652_01 - BNP Paribas|| FBKG|C20652_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20652_07 - BNP Paribas|| FBKG|C20652_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20652_08 - BNP Paribas|| FBKG|C20653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20653_01 - Cofinoga|| FBKG|C20653_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20653_02 - Cofinoga|| FBKG|C20653_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20653_03 - Cofinoga|| FBKG|C20653_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20653_07 - Cofinoga|| FBKG|C20653_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20653_08 - Cofinoga|| FBKG|C20653_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20653_09 - Cofinoga|| FBKG|C20655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20655_01 - Standard Bank|| FBKG|C20656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20656_01 - Credit Solutions|| FBKG|C20656_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20656_02 - Credit Solutions|| FBKG|C20656_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20656_03 - Credit Solutions|| FBKG|C20669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20669_01 - Maybank|| FBKG|C20669_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20669_02 - Maybank ISD|| FBKG|C20669_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20669_03 - Maybank|| FBKG|C20707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20707_01 - Bank of Ireland|| FBKG|C20707_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20707_02 - Bank of Ireland|| FBKG|C22219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22219_01 - Banco de Chile|| FBKG|C22226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22226_01 - BANCO INTERNACIONAL DEL PERU-INTERBANK|| FBKG|C22227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22227_01 - Banco Itaú Chile|| FBKG|C22228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22228_01 - Banco Provincial, S.A. , Banco Universal|| FBKG|C22231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22231_01 - BANCO SANTANDER|| FBKG|C22232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22232_01 - Banesco Banco Universal, C.A.|| FBKG|C22251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22251_01 - DINERS CLUB SA|| FBKG|C22296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22296_01 - TARGOBANK AG & Co. KGaA|| FBKG|C22297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22297_01 - Bank Zachodni WBK|| FBKG|C22297_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22297_02 - Bank Zachodni WBK|| FBKG|C22298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22298_01 - Commerce Bank|| FBKG|C22304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22304_01 - Bankdata|| FBKG|C22310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22310_01 - Carnegie Bank A/S|| FBKG|C22314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22314_01 - Ekspres Bank A/S|| FBKG|C22335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22335_01 - SEB Kort Bank AB|| FBKG|C22336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22336_01 - Spar Nord Bank|| FBKG|C22347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22347_01 - Ingenieria de Software Bancario SL|| FBKG|C22348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22348_01 - Banco Popular North America|| FBKG|C22349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22349_01 - Springleaf Finance Inc.|| FBKG|C22350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22350_01 - Bankinter|| FBKG|C29999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C29999_01 - Other Sub Sector FBKG|| FBKG|C21856_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21856_02 - Country Financial|| FBKG|C21857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21857_01 - UK Asset Resolution|| FBKG|C21857_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21857_02 - UK Asset Resolution|| FBKG|C21861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21861_01 - InfoCaja|| FBKG|C21865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21865_01 - BayernLB|| FBKG|C21868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21868_01 - Headfirst|| FBKG|C21872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21872_01 - Luup Limited|| FBKG|C21872_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21872_02 - Luup Limited|| FBKG|C21881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21881_01 - Temenos USA Inc.|| FBKG|C21891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21891_01 - LBS Bayerische Landesbausparkasse|| FBKG|C21892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21892_01 - Santander Consumer Bank AG|| FBKG|C21894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21894_01 - Ikano Bank GmbH|| FBKG|C21919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21919_01 - Credit Agricole is FBKG|| FBKG|C21923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21923_01 - Skandia Zycie TU S.A.|| FBKG|C21924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21924_01 - KeyBank National Association|| FBKG|C21924_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21924_02 - KeyBank National Association|| FBKG|C21924_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21924_03 - KeyBank National Association|| FBKG|C21926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21926_01 - Westpac Banking Corporation|| FBKG|C21927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21927_01 - First Nations Bank of Canada|| FBKG|C21938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21938_01 - Allied Bank Pakistan|| FBKG|C21946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21946_01 - Argenta|| FBKG|C21948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21948_01 - AXIS UK Limited|| FBKG|C21950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21950_01 - Banco Popular E|| FBKG|C21951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21951_01 - Banco Popular|| FBKG|C21952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21952_01 - Banco Rendimento|| FBKG|C21953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21953_01 - Bank|| FBKG|C21955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21955_01 - Bank of the Post|| FBKG|C21957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21957_01 - Banking|| FBKG|C21958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21958_01 - Banque centrale populaire|| FBKG|C21959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_01 - BANQUE DE FRANCE|| FBKG|C21959_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_02 - BANQUE DE FRANCE|| FBKG|C21959_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_03 - BANQUE DE FRANCE|| FBKG|C21959_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_04 - BANQUE DE FRANCE|| FBKG|C21959_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_05 - BANQUE DE FRANCE|| FBKG|C21959_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_06 - BANQUE DE FRANCE|| FBKG|C21959_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_11 - BANQUE DE FRANCE|| FBKG|C21959_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21959_12 - BANQUE DE FRANCE|| FBKG|C21960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_01 - BANQUE POP/CE|| FBKG|C21960_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_02 - BANQUE POP/CE|| FBKG|C21960_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_03 - BANQUE POP/CE|| FBKG|C21960_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_04 - BANQUE POP/CE|| FBKG|C21960_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_05 - BANQUE POP/CE|| FBKG|C21960_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_06 - BANQUE POP/CE|| FBKG|C21960_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_07 - BANQUE POP/CE|| FBKG|C21960_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_09 - BANQUE POP/CE|| FBKG|C21960_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_11 - BANQUE POP/CE|| FBKG|C21960_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_12 - BANQUE POP/CE|| FBKG|C21961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21961_01 - Barclays|| FBKG|C21962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21962_01 - Barclays Bank|| FBKG|C21962_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21962_02 - Barclays Bank|| FBKG|C21964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21964_01 - BCP|| FBKG|C21965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21965_01 - BDSI|| FBKG|C21966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21966_01 - Belfius|| FBKG|C21967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21967_01 - BES|| FBKG|C21971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21971_01 - BNA Angola|| FBKG|C21972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21972_01 - BNP|| FBKG|C21973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_01 - BNP PARIBAS|| FBKG|C21973_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_02 - BNP PARIBAS|| FBKG|C21973_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_03 - BNP PARIBAS|| FBKG|C21973_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_04 - BNP PARIBAS|| FBKG|C21973_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_05 - BNP PARIBAS|| FBKG|C21973_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_06 - BNP PARIBAS|| FBKG|C21973_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_09 - BNP PARIBAS|| FBKG|C21973_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_11 - BNP PARIBAS|| FBKG|C21973_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21973_12 - BNP PARIBAS|| FBKG|C21974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21974_01 - BNPP Fortis|| FBKG|C21977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21977_01 - Caixa Agricola|| FBKG|C21978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21978_01 - CAJA MADRID|| FBKG|C22163_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_12 - SOCIETE GENERALE|| FBKG|C22163_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_13 - SOCIETE GENERALE|| FBKG|C22164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22164_01 - S-Pankki Oy|| FBKG|C22165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22165_01 - Sparda|| FBKG|C22166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22166_01 - Sparkassen|| FBKG|C22167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22167_01 - Standard Bank of South Africa|| FBKG|C22172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22172_01 - Svenska Handelsbanken AB|| FBKG|C22174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22174_01 - Swedbank|| FBKG|C22176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22176_01 - Tesco Bank|| FBKG|C22184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22184_01 - Unicredit|| FBKG|C22184_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22184_02 - UniCredit Bank AG|| FBKG|C22185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22185_01 - Union IT|| FBKG|C22191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22191_01 - VW Bank|| FBKG|C22192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22192_01 - Westpac Banking Corporation|| FBKG|C22195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22195_01 - ABN AMRO|| FBKG|C22200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22200_01 - ABN AMRO|| FBKG|C22202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22202_01 - Other Banking|| FBKG|C22204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22204_01 - ING|| FBKG|C22204_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22204_02 - ING|| FBKG|C22211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22211_01 - AFP PRIMA|| FBKG|C22212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22212_01 - AFP Provida S.A.|| FBKG|C22213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22213_01 - ANA MARIA URREGO SARMIENTO|| FBKG|C22215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22215_01 - Aplica Soluciones Tecnológicas Chile Ltda.|| FBKG|C22216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22216_01 - Banchile Administradora General de Fondos|| FBKG|C22217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22217_01 - Banchile Corredores de Bolsa S.A.|| FBKG|C22218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22218_01 - Banco Bilbao Vizcaya Argentaria Chile|| FBKG|C22218_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22218_02 - Banco Bilbao Vizcaya Argentaria, S.A.|| FBKG|C31544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31544_01 - MULTICLIENT|| FBKG|C40339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40339_01 - Finance & Bank|| FBKG|C40376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40376_01 - Financial Services|| FBKG|C31590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31590_01 - Qatar Islamic Bank (QIB)|| FBKG|C31682_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31682_02 - BANCO CENTRAL DE CHILE|| FBKG|C31785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31785_01 - CECABANK S.A.|| FBKG|C31787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31787_01 - Punjab National Bank|| FBKG|C51682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C51682_01 - Adexi A/S|| FBKG|C51937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C51937_01 - Bankoforeningerne|| FBKG|C60318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C60318_01 - Credito Agricola Informatica-Sistemas de Infor|| FBKG|C60339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C60339_01 - First Tennessee - Operations Control|| FBKG|C60340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C60340_01 - Transbank S.A|| FBKG|C70570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C70570_01 - Isban Chile S.A.|| FBKG|C70341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C70341_01 - European Directories Holding B.V European Directories|| FBKG|C80914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80914_01 - BANK OF CHINA|| FBKG|C80960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80960_01 - NATIONAL BANK OF CANADA|| FBKG|C80966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80966_01 - POLARIS|| FBKG|C80968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80968_01 - PREMIUM CREDIT LIMITED|| FBKG|C80981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80981_01 - SOCIETE GENERALE|| FBKG|C80983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80983_01 - STANDARD BANK OF SOUTH AFRICA|| FBKG|C80998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80998_01 - UniCredit|| FBKG|C81000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81000_01 - VIRGIN MONEY|| FBKG|C81153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81153_01 - CitiBank NA|| FBKG|C81156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81156_01 - United Bank Limited|| FBKG|C80263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80263_01 - Bank of Tokyo|| FBKG|C80271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80271_01 - Lloyds|| FBKG|C80292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80292_01 - BANCO DE ESPAÑA|| FBKG|C80303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80303_01 - Columbia Basin Trust|| FBKG|C80305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80305_01 - REDSYS Servicios de Procesamiento, S.L.|| FBKG|C80307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80307_01 - Bankia, S.A.U.|| FBKG|C80321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80321_01 - Popular, Inc|| FBKG|C80336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80336_01 - PREMIUM CREDIT LIMITED|| FBKG|C80345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80345_01 - UK Payments Council Ltd|| FBKG|C80348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80348_01 - TURKIYE BANKALAR BIRLIGI|| FBKG|C80371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80371_01 - THE TORONTO DOMINION BANK|| FBKG|C80371_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80371_02 - The Toronto Dominion Bank|| FBKG|C80387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80387_01 - Raiffeisen Bank Polska S A|| FBKG|C80394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80394_01 - Raiffeisen Bank Polska|| FBKG|C80494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80494_01 - Anchor_Trust|| FBKG|C80509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80509_01 - Canal_&_River_Trust|| FBKG|C80570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80570_01 - Newcastle_Building_Society|| FBKG|C80571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80571_01 - NS&I|| FBKG|C80592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80592_01 - SMBCE|| FBKG|C80646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80646_01 - OSFI - SOA|| FBKG|C80654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80654_01 - OSFI - Architecture Support|| FBKG|C80655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80655_01 - OSFI - Testers and Test Lead|| FBKG|C80684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80684_01 - Liberbank|| FBKG|C80739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80739_01 - ING Vysya Bank Limited|| FBKG|C80771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80771_01 - Frost Bank|| FBKG|C80794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80794_01 - Centro de Asesoria Hiportecaria|| FBKG|C80795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80795_01 - SERCO DES INC.|| FBKG|C81268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81268_01 - FifthThirdBancorp|| FBKG|C81347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81347_01 - UCO Bank|| FBKG|C81377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81377_01 - SFW Bank|| FBKG|C81379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81379_01 - National Bank Trust Inc.|| FBKG|C21983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21983_01 - Central Bank of Chile|| FBKG|C21991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21991_01 - CGD|| FBKG|C21992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21992_01 - Cheque & Credit Clearing Company Ltd|| FBKG|C21994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21994_01 - Citibank|| FBKG|C21995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21995_01 - CITIGROUP PTY LIMITED|| FBKG|C21997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21997_01 - Cofidis|| FBKG|C22001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22001_01 - Credibom|| FBKG|C22002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_01 - CREDIT AGRICOLE|| FBKG|C22002_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_02 - CREDIT AGRICOLE|| FBKG|C22002_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_03 - CREDIT AGRICOLE|| FBKG|C22002_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_04 - CREDIT AGRICOLE|| FBKG|C22002_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_05 - CREDIT AGRICOLE|| FBKG|C22002_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_06 - CREDIT AGRICOLE|| FBKG|C22002_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_07 - CREDIT AGRICOLE|| FBKG|C22002_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_09 - CREDIT AGRICOLE|| FBKG|C22002_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_11 - CREDIT AGRICOLE|| FBKG|C22002_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_12 - CREDIT AGRICOLE|| FBKG|C22003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22003_01 - Credit du Maroc|| FBKG|C22004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_01 - CREDIT MUTUEL|| FBKG|C22004_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_02 - CREDIT MUTUEL|| FBKG|C22004_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_03 - CREDIT MUTUEL|| FBKG|C22004_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_04 - CREDIT MUTUEL|| FBKG|C22004_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_05 - CREDIT MUTUEL|| FBKG|C22004_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_06 - CREDIT MUTUEL|| FBKG|C22004_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_07 - CREDIT MUTUEL|| FBKG|C22004_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_11 - CREDIT MUTUEL|| FBKG|C22004_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_12 - CREDIT MUTUEL|| FBKG|C22007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22007_01 - Nets A/S|| FBKG|C22012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22012_01 - DekaBank|| FBKG|C22012_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22012_02 - DekaBank|| FBKG|C22013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22013_01 - Deustche Bank|| FBKG|C22014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22014_01 - Deutsche Bank|| FBKG|C22015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22015_01 - Deutsche Bank AG|| FBKG|C22018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22018_01 - DZBank|| FBKG|C22023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22023_01 - Eurafric information|| FBKG|C22028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22028_01 - Europe Arab Bank|| FBKG|C22032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22032_01 - FinanzInformatik|| FBKG|C22033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22033_01 - First Bank Middle East|| FBKG|C22038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22038_01 - Fristaende Sparbanker|| FBKG|C22042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22042_01 - GE Stockholm|| FBKG|C22053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22053_01 - HBOS|| FBKG|C22054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22054_01 - HSBC|| FBKG|C22054_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22054_02 - HSBC|| FBKG|C22054_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22054_03 - HSBC|| FBKG|C22054_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22054_04 - HSBC|| FBKG|C22054_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22054_05 - HSBC|| FBKG|C22054_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22054_06 - HSBC|| FBKG|C22059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22059_01 - ING|| FBKG|C22061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22061_01 - ING Direct (UK) NV|| FBKG|C22067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22067_01 - ISBAN|| FBKG|C22070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22070_01 - KBC|| FBKG|C22073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22073_01 - KfW|| FBKG|C22074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22074_01 - Komercni banka|| FBKG|C22076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_01 - C22076_13 - La Banque Postale|| FBKG|C22076_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_02 - LA BANQUE POSTALE|| FBKG|C22076_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_03 - LA BANQUE POSTALE|| FBKG|C22076_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_04 - LA BANQUE POSTALE|| FBKG|C22076_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_05 - LA BANQUE POSTALE|| FBKG|C22076_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_06 - LA BANQUE POSTALE|| FBKG|C22076_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_09 - LA BANQUE POSTALE|| FBKG|C22076_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_11 - LA BANQUE POSTALE|| FBKG|C22076_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_12 - LA BANQUE POSTALE|| FBKG|C22079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22079_01 - Landesbanken|| FBKG|C22080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22080_01 - Landshypotek|| FBKG|C22081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22081_01 - Lansforsakringar|| FBKG|C22082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22082_01 - Latvijas Banker|| FBKG|C22082_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22082_02 - Latvijas Banker|| FBKG|C22084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22084_01 - LLOYDS BANK PLC|| FBKG|C22084_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22084_02 - LLOYDS BANK PLC|| FBKG|C22090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22090_01 - MULTICLIENT|| FBKG|C22092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22092_01 - Muslim UK_Commercial_Non_PSA Bank Limited|| FBKG|C22097_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22097_03 - NATIONAL BANK OF ABERBAIJAN|| FBKG|C22105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22105_01 - Northern Rock Plc|| FBKG|C22116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22116_01 - Other - Financial Services|| FBKG|C22119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22119_01 - Other - Financial Services|| FBKG|C22120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22120_01 - Other - Financial Services|| FBKG|C22121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22121_01 - Other ? Financial Services|| FBKG|C22129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22129_01 - PI 2008 Installation|| FBKG|C22130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22130_01 - PI enhance support & installation|| FBKG|C22131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22131_01 - POLARIS|| FBKG|C22132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22132_01 - Postfinance|| FBKG|C22137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22137_01 - QLM/QPH Product License|| FBKG|C22138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22138_01 - QLM/QPH Support and Maintenance|| FBKG|C22139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22139_01 - QPH / QLM CR development|| FBKG|C22141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22141_01 - RBI|| FBKG|C22144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22144_01 - ResursFinans|| FBKG|C22152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22152_01 - Santander Bank|| FBKG|C22154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22154_01 - Saxo Bank A/S|| FBKG|C22155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22155_01 - SBAB|| FBKG|C22157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22157_01 - SEB|| FBKG|C22158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22158_01 - SHB|| FBKG|C22159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22159_01 - SIAM UK_Commercial_Non_PSA Bank|| FBKG|C22163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_01 - SOCIETE GENERALE|| FBKG|C22163_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_02 - SOCIETE GENERALE|| FBKG|C22163_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_03 - SOCIETE GENERALE|| FBKG|C22163_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_04 - SOCIETE GENERALE|| FBKG|C22163_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_05 - SOCIETE GENERALE|| FBKG|C22163_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_06 - SOCIETE GENERALE|| FBKG|C22163_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_07 - Société Générale - Global Account (FR)|| FBKG|C22163_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_09 - SOCIETE GENERALE|| FBKG|C22163_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22163_11 - SOCIETE GENERALE|| FBKG|C22196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22196_01 - ABN AMRO ( RBS)|| FBKG|C80907_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80907_02 - AXIS Bank Limited|| FBKG|C20247_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20247_02 - WILMINGTON INESE S.L.|| FBKG|C10004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C10004_01 - Bank of Tokyo Mitsubishi UFJ|| FBKG|C21989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21989_01 - Cerdo bankpartner|| FBKG|C81466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81466_01 - Al Rajhi Bank|| FBKG|C81467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81467_01 - Deutsche Bank|| FBKG|C22147_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22147_03 - ROTHSCHILD|| FBKG|C22147_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22147_04 - ROTHSCHILD|| FBKG|C22147_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22147_05 - ROTHSCHILD|| FBKG|C22147_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22147_06 - ROTHSCHILD|| FBKG|C22162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22162_01 - Societe General|| FBKG|C22214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22214_01 - ANULADOS|| FBKG|C22221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22221_01 - BANCO DE LA NACION|| FBKG|C22223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22223_01 - Banco Exterior, C.A. , Banco Universal|| FBKG|C22224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22224_01 - Banco Federal, C.A.|| FBKG|C22229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22229_01 - Banco Provivienda, C.A. Banco Universal (BanPro)|| FBKG|C22230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22230_01 - Banco Provivienda, C.A. Banco Universal (BanPro)|| FBKG|C22264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22264_01 - Intergroup Financial Service|| FBKG|C22305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22305_01 - BankInvest|| FBKG|C22307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22307_01 - Blokeret - E-trade Bank A/S - brug 50931|| FBKG|C22328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22328_01 - Nykredit Realkredit A/S|| FBKG|C31786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31786_01 - Société Générale - Corp. & Invest. Banking|| FBKG|C31786_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31786_02 - Société Générale - France|| FBKG|C31788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C31788_01 - Janata Sahakari Bank Limited|| FBKG|C40332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40332_01 - ABN AMRO|| FBKG|C40333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40333_01 - Bank|| FBKG|C40335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40335_01 - Banking|| FBKG|C40340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40340_01 - Fristaende Sparbanker|| FBKG|C40341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40341_01 - GE Stockholm|| FBKG|C40342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40342_01 - Landshypotek|| FBKG|C40345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40345_01 - RBS|| FBKG|C40346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40346_01 - ResursFinans|| FBKG|C40347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40347_01 - Riksbanken|| FBKG|C40349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40349_01 - SBAB|| FBKG|C40350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40350_01 - SEB|| FBKG|C40351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40351_01 - SHB|| FBKG|C40352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40352_01 - Swedbank|| FBKG|C40365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40365_01 - Lansforsakringar|| FBKG|C40382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C40382_01 - BBVA Fiduciaria S.A.|| FBKG|C70269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C70269_01 - Central Bank of Iran (CBI)|| FBKG|C80225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80225_01 - (Unknown)|| FBKG|C80447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80447_01 - Troy CoE|| FBKG|C80652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80652_01 - Bank of Canada ? IT Services|| FBKG|C81512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81512_01 - Olympia Financial|| FBKG|C81529_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81529_01 - TBC Bank|| FBKG|C20001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20001_01 - GRT and CMI|| FBKG|C20002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20002_01 - Secteur GSSTI|| FBKG|C20002_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20002_02 - Secteur GSSTI|| FBKG|C20002_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20002_03 - Secteur GSSTI|| FBKG|C20002_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20002_04 - Secteur GSSTI|| FBKG|C20015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20015_01 - Affaires bancaires - Gouvernements|| FBKG|C20018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20018_01 - AFSC - Agriculture Financial Services Corp.|| FBKG|C20028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20028_01 - Altamira|| FBKG|C20028_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20028_02 - Altamira|| FBKG|C20031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20031_01 - Amelioration Continue Optima|| FBKG|C20038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20038_01 - American General Finance|| FBKG|C20046_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20046_03 - AMSouth Bank|| FBKG|C20053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20053_01 - ARCH - OBS Utilisation PayPass|| FBKG|C20069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20069_01 - Banco Rio de la Plata|| FBKG|C20069_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20069_02 - Banco Rio de la Plata|| FBKG|C20070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20070_01 - Banco Santander|| FBKG|C20098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20098_01 - C Performance Organisationnelle|| FBKG|C20099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20099_01 - CA Housing Finance Agency|| FBKG|C20109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20109_01 - CAP Besoins Liv.1 Arch.|| FBKG|C20110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20110_01 - CAP - Certificat EMV et outils de test|| FBKG|C20113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20113_01 - CAP - Pilotage et transition|| FBKG|C20124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20124_01 - Centre de paiements|| FBKG|C20125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20125_01 - Centre de Performance Organisationnelle|| FBKG|C20126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20126_01 - Centre de Relation Client|| FBKG|C20127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20127_01 - Centre d'expertise Intel. Aff (CEIA)|| FBKG|C20127_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20127_02 - Centre d'expertise Intel. Aff (CEIA)|| FBKG|C20128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20128_01 - Centre Paiements International|| FBKG|C20129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20129_01 - Certification|| FBKG|C20130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20130_01 - Change International|| FBKG|C20132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20132_01 - Chevy Chase FSB|| FBKG|C20132_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20132_02 - Chevy Chase Bank|| FBKG|C20144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20144_01 - Clemex Technologie|| FBKG|C20150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20150_01 - Comm.-Solution de Credit et de Plac.|| FBKG|C21010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21010_01 - Credit Agricole|| FBKG|C21010_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21010_02 - Credit Agricole|| FBKG|C21011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21011_01 - TD Banknorth|| FBKG|C21027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21027_01 - Acxiom-Wells Fargo|| FBKG|C21027_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21027_02 - Acxiom-Wells Fargo|| FBKG|C21124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21124_01 - Arc 360|| FBKG|C21125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21125_01 - BIE - Banque hypothécaire européenne|| FBKG|C21158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21158_01 - GE Money U.S.|| FBKG|C21165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21165_01 - Alior Bank S.A.|| FBKG|C21794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21794_01 - Code US - Banking and Investments|| FBKG|C21835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21835_01 - Basin Financial|| FBKG|C21870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21870_01 - BMO Nesbitt Burns International|| FBKG|C21883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21883_01 - BMO Harris Bank|| FBKG|C21883_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21883_02 - BMO Harris Bank|| FBKG|C21898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21898_01 - Home Trust Company|| FBKG|C21906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21906_01 - Banco de Portugal|| FBKG|C21920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21920_01 - UnionBanCal Corporation|| FBKG|C21949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21949_01 - Banco de Portugal|| FBKG|C21975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21975_01 - BOB-AML|| FBKG|C22017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22017_01 - DINERS CLUB PTY LIMITED|| FBKG|C22049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22049_01 - Grupo Banif|| FBKG|C22060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22060_01 - ING|| FBKG|C22095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22095_01 - National Bank of Belgium|| FBKG|C22142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22142_01 - RBS|| FBKG|C22145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22145_01 - Riksbanken|| FBKG|C22147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22147_01 - ROTHSCHILD|| FBKG|C22147_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22147_02 - ROTHSCHILD|| FBKG|C80808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80808_01 - BNP Parisbas Mediterranée Innovation et Technologie|| FBKG|C80815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80815_01 - Personal Touch Financial Services Limite|| FBKG|C80815_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80815_02 - Personal Touch Financial Services Limite|| FBKG|C81204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81204_01 - Canadian Western Bank|| FBKG|C81395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81395_01 - FGA Bank Germany GmbH|| FBKG|C81417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81417_01 - Bank Al Jazira|| FBKG|C20607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20607_01 - Vice-Presidence Int. Affaires|| FBKG|C20610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20610_01 - Washington Mutual|| FBKG|C20613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20613_01 - Western Financial Services|| FBKG|C20613_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20613_02 - Western Financial Group|| FBKG|C20668_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20668_02 - Lombard|| FBKG|C20673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20673_01 - Americo|| FBKG|C20678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20678_01 - Liberty Peerless Agency|| FBKG|C20680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20680_01 - Development Bank of Canada|| FBKG|C20708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20708_01 - Dexia Credit local|| FBKG|C20723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20723_01 - Gestion de placements Innocap|| FBKG|C20733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20733_01 - CitiCorp Savings of Illinois|| FBKG|C20733_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20733_02 - CitiCorp Savings of Illinois|| FBKG|C20762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20762_01 - Necigef B.V.|| FBKG|C20782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20782_01 - Fifth 3rd Bank|| FBKG|C20809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20809_01 - Springs Mortgage Company|| FBKG|C20837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20837_01 - Natixis|| FBKG|C20841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20841_01 - Manufacturers and Traders Trust Company|| FBKG|C20847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20847_01 - Comstate Resources Limited|| FBKG|C20850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20850_01 - CapLink Financial Corporation|| FBKG|C20867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20867_01 - CNCEP|| FBKG|C20167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20167_01 - Courtage � Escompte|| FBKG|C20170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20170_01 - Credit Hypothecaire Ontario|| FBKG|C20175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20175_01 - Credit Reseau - Affaires Bancaires|| FBKG|C20186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20186_01 - Dev. Operation Impl. & Formation|| FBKG|C20190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20190_01 - Direction Operations|| FBKG|C20191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20191_01 - Direction Solution Credit & Placements|| FBKG|C20199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20199_01 - Dev. Operations et Implantations|| FBKG|C20199_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20199_03 - Dev. Operations et Implantations|| FBKG|C20200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20200_01 - Developpement Hypothecaire et Demarcheurs|| FBKG|C20201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20201_01 - Dynamic Funds - DAS - New Arch 1|| FBKG|C20217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20217_01 - Equipe Projets|| FBKG|C20236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20236_01 - Fin.Biens Consommation|| FBKG|C20244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20244_01 - First USA Bank|| FBKG|C20247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20247_01 - FNB Wilmington|| FBKG|C20255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20255_01 - Frontier Bank|| FBKG|C20255_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20255_02 - Frontier Bank|| FBKG|C20256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20256_01 - FST Tennessee|| FBKG|C20269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20269_01 - GGNC - Groupe Gestion Numeraire|| FBKG|C20272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20272_01 - Global Card|| FBKG|C20272_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20272_02 - Global Card|| FBKG|C20287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20287_01 - Guichet Unique|| FBKG|C20315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20315_01 - IN American General Finance|| FBKG|C20318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20318_01 - Infra. Succursales et SAE|| FBKG|C20318_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20318_02 - Infra. Succursales et SAE|| FBKG|C20342_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20342_02 - Key Corporation|| FBKG|C20360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20360_01 - London Life|| FBKG|C20367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20367_01 - Malayan Banking Berhad|| FBKG|C20367_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20367_02 - Malayan Banking Berhad|| FBKG|C20367_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20367_03 - Malayan Banking Berhad|| FBKG|C20371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20371_01 - Marketing et Communication assur. pers.|| FBKG|C20388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20388_01 - Middlefield Mutual Fund Ltd|| FBKG|C20391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20391_01 - Moneris Solutions|| FBKG|C20391_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20391_02 - Moneris Solutions|| FBKG|C20391_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20391_03 - Moneris Solutions|| FBKG|C20431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20431_01 - Operations Techno. Info.|| FBKG|C20439_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20439_02 - Pancanadien-Mode Centre|| FBKG|C20468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20468_01 - Produit Vista 350|| FBKG|C20469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20469_01 - Prog. Tr. Operationnelle|| FBKG|C20470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20470_01 - Progistix Solutions Inc.|| FBKG|C20473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20473_01 - Projet Apollo|| FBKG|C20474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20474_01 - Projet Cap-Base|| FBKG|C20484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20484_01 - Relations Correspondants|| FBKG|C20544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20544_01 - Systems d'Information Finances|| FBKG|C20546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20546_01 - T.G. Administration|| FBKG|C20546_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20546_02 - T.G. Administration|| FBKG|C20585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20585_01 - Unibanco|| FBKG|C20585_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20585_02 - Unibanco|| FBKG|C20597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20597_01 - UOB Singapore|| FBKG|C80240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80240_01 - BTMU|| FBKG|C80241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80241_01 - Societe Generale|| FBKG|C80264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80264_01 - Bank of Tokyo ASP|| FBKG|C80375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80375_01 - Nova Scotia|| FBKG|C10376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C10376_01 - Progistix Solutions Inc.|| FBKG|C22118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22118_01 - Other - Financial Services|| FBKG|C80110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80110_01 - CCS Income Trust|| FBKG|C81546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81546_01 - Nedbank Group Limited|| FBKG|C81555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81555_01 - Quindell Solutions Inc.|| FBKG|C20549_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_10 - TD Bank N.A.|| FBKG|C81649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81649_01 - Middelfart Sparekasse|| FBKG|C81654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81654_01 - Sparekassen Himmerland A/S|| FBKG|C81664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81664_01 - P/F BankNordik|| FBKG|C81668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81668_01 - C81668_01 - Bank of America NA,|| FBKG|C81671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81671_01 - C81671_01 - CITI Bank N A|| FBKG|C81679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81679_01 - C81679_01 - DCB Bank Ltd|| FBKG|C81658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81658_01 - Nordea Kredit, Realkreditaktieselskab|| FBKG|C81659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81659_01 - Nordea Kredit, Realkreditaktieselskab|| FBKG|C81673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81673_01 - C81673_01 - ING Vysya Bank Ltd|| FBKG|C81677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81677_01 - C81677_01 - Syndicate Bank|| FBKG|C81678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81678_01 - C81678_01 - The Royal Bank of Scotland N.V.|| FBKG|C80371_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80371_03 - The Toronto-Dominion Bank|| FBKG|C81664_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81664_02 - C81664_01 - P/F BankNordik|| FBKG|C81668_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81668_13 - C81668_01 - Bank of America NA,|| FBKG|C81671_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81671_03 - C81671_01 - CITI Bank N A|| FBKG|C81673_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81673_02 - C81673_01 - ING Vysya Bank Ltd|| FBKG|C81677_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81677_02 - C81677_01 - Syndicate Bank|| FBKG|C22076_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22076_13 - C22076_13 - La Banque Postale|| FBKG|C20306_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20306_04 - The Huntington National Bank Inc|| FBKG|C81831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81831_01 - SNS|| FBKG|C81833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81833_01 - Bank Insinger de Beaufort|| FBKG|C81862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81862_01 - CTBC Bank Corp. (Canada)|| FBKG|C81881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81881_01 - Reserve Royalty Income Trust (RRIT)|| FBKG|C81884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81884_01 - Kommune Leasing A/S|| FBKG|C81885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81885_01 - Soci�t� G�n�rale Paris|| FBKG|C20804_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20804_03 - Banco Santander (Brasil) S.A.|| FBKG|C20076_30|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20076_30 - BNC - Banque Nationale du Canada (New booking)|| FBKG|C20549_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20549_11 - TD Bank N.A.|| FBKG|C81922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81922_01 - OneMain Financial, Inc.(DE)|| FBKG|C81924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81924_01 - Springleaf Financial|| FBKG|C22117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22117_01 - Other - Financial services|| FBKG|C81934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81934_01 - M&T Bank - Credit|| FBKG|C81943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81943_01 - Magyar Nemzeti Bank (MNB)|| FBKG|C20539_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C20539_06 - SunTrust Bank|| FBKG|C81974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C81974_01 - Canara Bank|| FBKG|C82020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82020_01 - Sainsbury's Bank|| FBKG|C82034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82034_01 - Sberbank|| FBKG|C80371_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C80371_04 - THETORONTODOMINIONBANK|| FBKG|C82096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82096_01 - Ariba Inc.|| FBKG|C82136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82136_01 - Askari Bank Ltd|| FBKG|C82138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82138_01 - Banco Citibank S.A|| FBKG|C82142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82142_01 - Citigroup Technology, Inc.|| FBKG|C82147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82147_01 - Credit Europe Bank N.V|| FBKG|C82155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82155_01 - MCB Bank Limited|| FBKG|C82158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82158_01 - Nedbank|| FBKG|C82173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82173_01 - TD Bank, N.A|| FBKG|C82257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82257_01 - Acadia Financial Services|| FBKG|C82291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82291_01 - DNB Bank ASA, filial Sverige|| FBKG|C82295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82295_01 - Marginalen Bank Bankaktiebolag|| FBKG|C82315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82315_01 - SBAB Bank AB (publ)|| FBKG|C82329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82329_01 - Entercard Norge AS|| FBKG|C82378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82378_01 - First Citizens Bank & Trust|| FBKG|C82385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82385_01 - M&T BANK|| FBKG|C82386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82386_01 - FEDERAL RESERVE BANK OF NEW YORK|| FBKG|C82392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82392_01 - MB Financial Bank N.A.|| FBKG|C82411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82411_01 - Wells Fargo|| FBKG|C82421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82421_01 - MVB Bank|| FBKG|C82447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82447_01 - Bridgewater Bank|| FBKG|C82449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82449_01 - Branch Banking & Trust|| FBKG|C82455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82455_01 - SkandiaBanken AB|| FBKG|C82457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82457_01 - The Card Scandinavia AB|| FBKG|C82458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82458_01 - Marginalen Bank Bankaktiebolag|| FBKG|C82459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82459_01 - Ikano Bank AB|| FBKG|C82462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82462_01 - TERRA KORTBANK AS|| FBKG|C82463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82463_01 - DNB Bank ASA, filial Sverige|| FBKG|C82465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82465_01 - Resurs Bank AB|| FBKG|C82466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82466_01 - ICA Banken AB|| FBKG|C82467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82467_01 - Skandia America Corporation|| FBKG|C82502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82502_01 - Other Banking & Insurance|| FBKG|C82517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82517_01 - COREALCREDIT BANK AG|| FBKG|C82518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82518_01 - Deutsche Bundesbank|| FBKG|C82519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82519_01 - W&W Informatik GmbH|| FBKG|C82542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82542_01 - GADCHIROLI DISTRICT CENTRAL CO-OP BANK|| FBKG|C82545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82545_01 - Citifinancial Canada Inc.|| FBKG|C82573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82573_01 - WFS Financial|| FBKG|C82619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82619_01 - TD Auto Finance LLC|| FBKG|C82621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82621_01 - American Express Travel Services|| FBKG|C82624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82624_01 - STATE STREET BANK & TRUST|| FBKG|C82628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82628_01 - TD Bank, N.A|| FBKG|C82641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82641_01 - OneMain Financial, Inc. (DE)|| FBKG|C82643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82643_01 - Navient Solutions, Inc. (fka Sallie Mae)|| FBKG|C82717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82717_01 - KeyBank National Assoc. (Key Services)|| FBKG|C82802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82802_01 - The Bessemer Group, Incorporation|| FBKG|C82807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82807_01 - CitiBank NA|| FBKG|C82854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82854_01 - UBS|| FBKG|C82879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82879_01 - GlobalCardS.A.deC.V|| FBKG|C82890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82890_01 - BancoRiodeLaPlata|| FBKG|C82893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82893_01 - UnibancoS.A.|| FBKG|C82896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82896_01 - WFSFinancial|| FBKG|C82906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C82906_01 - WashingtonMutualFinance|| FBKG|C83029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83029_01 - First National Bank of Omaha|| FBKG|C83035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83035_01 - Union Bank of California|| FBKG|C83056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83056_01 - Bridgewater Bank|| FBKG|C83017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||To_be_Classified_Att|C83017_01 - HWG GMA Interco|| FBKG|C83091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83091_01 - Argenta Spaarbank NV|| FBKG|C83138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83138_01 - COMMERCE BANK|| FBKG|C83391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83391_01 - METAVANTE|| FBKG|C21960_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C21960_13 - BANQUE POP/CE|| FBKG|C22002_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22002_13 - CREDIT AGRICOLE|| FBKG|C22004_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C22004_13 - CREDIT MUTUEL|| FBKG|C83435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83435_01 - BANQUE POP/CE|| FBKG|C83438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83438_01 - BNP PARIBAS|| FBKG|C83459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83459_01 - VAULTEX UK|| FBKG|C83460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83460_01 - CSOB CZ (KBC Group)|| FBKG|C83466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83466_01 - LATITUDE FINANCIAL SERVICES|| FBKG|C83482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83482_01 - Aqua Finance, Inc.|| FBKG|C83564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83564_01 - Lloyds|| FBKG|C83688_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83688_01 - ERROR|| FBKG|C83689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83689_01 - CDCP SK|| FBKG|C83690_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83690_01 - Slovenska sporitelna|| FBKG|C83702_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83702_01 - First Citizens Bank & Trust Company|| FBKG|C83720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83720_01 - AMARILLO NATIONAL|| FBKG|C83722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83722_01 - American Express Travel Services|| FBKG|C83724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83724_01 - AMERICAN GENERAL FINANCE|| FBKG|C83732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83732_01 - ANZ Banking Group Limited|| FBKG|C83750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83750_01 - Banco Bradesco S.A.|| FBKG|C83751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83751_01 - Banco Citibank S.A|| FBKG|C83752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83752_01 - Banco do Brasil S.A.|| FBKG|C83753_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83753_01 - Banco Rio de La Plata|| FBKG|C83758_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83758_01 - Bank of the West|| FBKG|C83763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83763_01 - BBVA Compass (Compass Bank)|| FBKG|C83801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83801_01 - Chevy Chase Bank|| FBKG|C83806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83806_01 - Citicorp Savings - IL|| FBKG|C83807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83807_01 - CitiFinancial|| FBKG|C83808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83808_01 - Citigroup Technology, Inc.|| FBKG|C83826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83826_01 - Compass Bank|| FBKG|C83881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83881_01 - Fifth Third Bank|| FBKG|C83883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83883_01 - First Citizens Bank & Trust|| FBKG|C83884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83884_01 - First Tennessee Bank|| FBKG|C83919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83919_01 - HSBC - Argentina|| FBKG|C83920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83920_01 - Huntington National Bank|| FBKG|C83939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83939_01 - KEYBANK NATIONAL ASSOC.|| FBKG|C83940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83940_01 - KeyBank National Assoc. (Key Services)|| FBKG|C83957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83957_01 - M&T Bank|| FBKG|C83965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83965_01 - Maybank ISD|| FBKG|C83989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83989_01 - National Bank of Canada|| FBKG|C83990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83990_01 - National City Bank|| FBKG|C83994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C83994_01 - Navient Solutions, Inc. (fka Sallie Mae)|| FBKG|C84038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84038_01 - PNC Bank|| FBKG|C84039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84039_01 - Popular, Inc|| FBKG|C84103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84103_01 - SunTrust Bank|| FBKG|C84122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84122_01 - THE BANK OF NEW YORK TRUST CO.|| FBKG|C84123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84123_01 - The Bessemer Group, Incorporation|| FBKG|C84134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84134_01 - U.S. Bank|| FBKG|C84136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84136_01 - Unibanco S.A.|| FBKG|C84137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84137_01 - Union Bank of California|| FBKG|C84153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84153_01 - Wachovia Bank|| FBKG|C84161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84161_01 - WFS Financial|| FBKG|C84163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84163_01 - Whitney National Bank|| FBKG|C84165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84165_01 - WILBANKS - WINDOWS PROJECT|| FBKG|C84181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84181_01 - Union Bank of Nigeria PLC|| FBKG|C84199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84199_01 - CitiFinancial, Inc.|| FBKG|C84202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84202_01 - NYS Banking Department|| FBKG|C84215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84215_01 - Postova banka, a.s.|| FBKG|C84219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84219_01 - MAYBANK|| FBKG|C84251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84251_01 - Regions Bank|| FBKG|C84309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84309_01 - Bancorp South|| FBKG|C84311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84311_01 - MB Financial Bank|| FBKG|C84313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84313_01 - Skandinaviska Enskilda Banken AB|| FBKG|C84318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84318_01 - Bank of Canada BRE|| FBKG|C84335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84335_01 - The National Commercial Bank|| FBKG|C84339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84339_01 - Wells Fargo Dealer Services|| FBKG|C84358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84358_01 - MUFG Union Bank N.A.|| FBKG|C84389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84389_01 - Metro Bank PLC|| FBKG|C84405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84405_01 - Citibank N.A. (London)|| FBKG|C84406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84406_01 - Banco de Guatemala|| FBKG|C84410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBKG_Att|C84410_01 - BB&T|| Retail_Banking|FBUS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FBUS|C20153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20153_01 - Community Savings and Credit Untion Limited|| FBUS|C20157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20157_01 - Conexus Credit Union|| FBUS|C20172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20172_01 - Credit Union Payment Services|| FBUS|C20173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20173_01 - Creston and District Credit Union|| FBUS|C20198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20198_01 - Dunnville and District Credit Union Ltd|| FBUS|C20206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20206_01 - Education Credit Union Limited|| FBUS|C20214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20214_01 - Enderby and District Credit Union|| FBUS|C20219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20219_01 - Espanol and District Credit Union Ltd|| FBUS|C20229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20229_01 - Federal Employees Credit (Kingston)|| FBUS|C20249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20249_01 - Food Family Credit Union Limited|| FBUS|C20251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20251_01 - Fort Erie Community Credit Union Limited|| FBUS|C20257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_01 - FCDQ - Fédération des Caisses Desjardins du Québec|| FBUS|C20257_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_02 - Mouvement Desjardins|| FBUS|C20257_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_03 - FCDQ - Fédération des Caisses Desjardins du Québec|| FBUS|C20257_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_06 - FCDQ - Fédération des Caisses Desjardins du Québec|| FBUS|C20257_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_07 - FCDQ - Fédération des Caisses Desjardins du Québec|| FBUS|C20257_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_08 - FCDQ - Fédération des Caisses Desjardins du Québec|| FBUS|C20257_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_09 - FCDQ - Fédération des Caisses Desjardins du Québec|| FBUS|C20257_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_10 - Federation des Caisses Desjardins du Quebec (FCDQ)|| FBUS|C20260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20260_01 - Ganaraska Credit UnionLimited|| FBUS|C20320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20320_01 - People's Credit Union|| FBUS|C20325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20325_01 - Interior Savings Credit Union|| FBUS|C20327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20327_01 - Inventure Solutions|| FBUS|C20327_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20327_02 - Inventure Solutions|| FBUS|C20341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20341_01 - Copperfin Credit Union|| FBUS|C20343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20343_01 - Kingston Community Credit Union Limited|| FBUS|C20381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20381_01 - Memberone Credit Union Limited|| FBUS|C20382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20382_01 - Mennonite Savings and Credit Union|| FBUS|C20382_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20382_02 - Mennonite Savings and Credit Union|| FBUS|C20393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20393_01 - Motor City Community Credit Union Limited|| FBUS|C20393_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20393_02 - Motor City Community Credit Union Limited|| FBUS|C20406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20406_01 - Navy Federal Credit Union|| FBUS|C20406_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20406_02 - Navy Federal Credit Union|| FBUS|C20406_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20406_03 - Navy Federal Credit Union|| FBUS|C20415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20415_01 - North Valley Credit Union|| FBUS|C20416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20416_01 - Northern Credit Union Limited|| FBUS|C20016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20016_01 - Affinity Credit Union|| FBUS|C20016_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20016_02 - Affinity Credit Union|| FBUS|C20078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20078_01 - CAG-Alliance User Group|| FBUS|C20108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20108_01 - Canal City Savings and Credit Union Ltd|| FBUS|C20116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20116_01 - Heritage Credit Union|| FBUS|C20117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20117_01 - Cataract Savings and Credit Union Limited|| FBUS|C20866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20866_01 - Caisse Centrale Desjardins|| FBUS|C20866_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20866_02 - Caisse Centrale Desjardins|| FBUS|C20866_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20866_03 - Caisse Centrale Desjardins|| FBUS|C20866_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20866_04 - Caisse centrale Desjardins du Quebec|| FBUS|C21023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21023_01 - Credit Union Central of Alberta|| FBUS|C21120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21120_01 - Broadview Credit Union Ltd|| FBUS|C21121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21121_01 - Govan Credit Union Ltd|| FBUS|C21123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21123_01 - Credit Mutuel Est|| FBUS|C21123_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21123_07 - Credit Mutuel Est|| FBUS|C21123_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21123_08 - Credit Mutuel Est|| FBUS|C21135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21135_01 - New Community Credit Union|| FBUS|C21138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21138_01 - Bausparkasse Schwäbisch Hall AG|| FBUS|C21162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21162_01 - Credit Union Services Association|| FBUS|C21171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21171_01 - Central 1 Credit Union|| FBUS|C21806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21806_01 - Credit Union Central of Nova Scotia|| FBUS|C21841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21841_01 - GTD - Groupe Technologies Desjardins|| FBUS|C21841_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21841_02 - GTD - Groupe Technologies Desjardins|| FBUS|C21841_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21841_03 - GTD - Groupe Technologies Desjardins|| FBUS|C21841_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21841_04 - GTD - Groupe Technologies Desjardins|| FBUS|C21841_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21841_05 - GTD - Groupe Technologies Desjardins|| FBUS|C20417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20417_01 - Northern Lights Credit Union Limited|| FBUS|C20422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20422_01 - Northridge Savings and Credit Union Limited|| FBUS|C20427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20427_01 - Ontario Civil Service Credit Union|| FBUS|C20428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20428_01 - Ontario Provincial Police Association|| FBUS|C20435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20435_01 - Front Line Financial|| FBUS|C20436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20436_01 - Ottawa Police Credit Union|| FBUS|C20449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20449_01 - PenFinancial Credit Union Limited|| FBUS|C20451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20451_01 - Pentagon Federal Credit Union|| FBUS|C20451_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20451_02 - Pentagon Federal Credit Union|| FBUS|C20451_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20451_03 - Pentagon Federal Credit Union|| FBUS|C20451_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20451_04 - Pentagon Federal Credit Union|| FBUS|C20451_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20451_05 - Cape Regional Credit Union (DMS)|| FBUS|C20465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20465_01 - Prairie Pride Credit Union|| FBUS|C20480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20480_01 - Quintessential Credit Union|| FBUS|C20490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20490_01 - Rochdale Credit Union Limited|| FBUS|C20501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20501_01 - Salmon Arm Savings and Credit Union|| FBUS|C20524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20524_01 - Southwest Regional Credit Union Ltd|| FBUS|C20531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20531_01 - Luminus Credit Union|| FBUS|C20536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20536_01 - Sudbury Regional Credit Union Limited|| FBUS|C20540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20540_01 - Superior Credit Union Limited|| FBUS|C20542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20542_01 - Mainstreet Credit Union|| FBUS|C20547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20547_01 - TCU Financial Group|| FBUS|C20550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20550_01 - Tandem Financial Credit Union|| FBUS|C20551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20551_01 - Tele-Pop Inc.|| FBUS|C20558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20558_01 - The Police Credit Union Limited|| FBUS|C20563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20563_01 - Thorold Community Credit Union Ltd|| FBUS|C20570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20570_01 - Toronto Catholic School Board Employee's|| FBUS|C20571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20571_01 - Toronto Municipal Employees Credit|| FBUS|C20586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20586_01 - Unigasco Community Credit Union Limited|| FBUS|C20591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20591_01 - Unity Savings and Credit Union Limited|| FBUS|C20606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20606_01 - Vantage One Credit Union|| FBUS|C20616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20616_01 - Windsor Family Credit Union Limited|| FBUS|C20618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20618_01 - United Communities Credit Union|| FBUS|C20621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20621_01 - Your Credit Union|| FBUS|C29999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C29999_02 - Other Sub Sector FBUS|| FBUS|C21866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21866_01 - Fédération des Caisses Populaires Acadiennes|| FBUS|C21879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21879_01 - Crédit Coopératif|| FBUS|C21895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21895_01 - Canadian Western Trust|| FBUS|C21895_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21895_02 - Canadian Western Trust (subsidiary of CWB)|| FBUS|C21912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21912_01 - Concentra Financial|| FBUS|C21912_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21912_02 - Concentra Financial|| FBUS|C21916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21916_01 - Bayview Credit Union|| FBUS|C22207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C22207_01 - Rabobank Group|| FBUS|C22207_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C22207_02 - Rabobank Group|| FBUS|C40330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C40330_01 - VanCity Savings Credit Union|| FBUS|C80759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80759_01 - First West Credit Union|| FBUS|C80770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80770_01 - Baltimore/Washington CU (DMS)|| FBUS|C81217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81217_01 - Mainstreet Credit Union|| FBUS|C81366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81366_01 - Caixa Economica Montepio Geral|| FBUS|C81482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81482_01 - Prosperity One Credit Union Limited|| FBUS|C81520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81520_01 - AdvantagePlus of Indiana Federal CU (DMS)|| FBUS|C20009_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20009_02 - Access Group|| FBUS|C20029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20029_01 - Alterna Savings and Credit Union|| FBUS|C20060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20060_01 - Auto Workers Community Credit Union|| FBUS|C20149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20149_01 - Comm Credit Corp.|| FBUS|C21126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21126_01 - DCR - Desjardins capital de risque|| FBUS|C21127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21127_01 - DGIA - Desjardins gestion international d'actifs (Opvest)|| FBUS|C21823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21823_01 - VR Kreditwerk Hamburg|| FBUS|C80755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80755_01 - Libro Financial Group|| FBUS|C80756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80756_01 - Westminster Savings Credit Union|| FBUS|C80757_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80757_01 - Servus Credit Union Ltd.|| FBUS|C80758_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80758_01 - Island Savings Credit Union|| FBUS|C80760_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80760_01 - Kootenay Savings|| FBUS|C80761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80761_01 - CUTASC|| FBUS|C80762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80762_01 - Connect First Credit Union Ltd|| FBUS|C80763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C80763_01 - PROSPERA CREDIT UNION|| FBUS|C81195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81195_01 - HERITAGE SAVINGS & CREDIT UNION INC|| FBUS|C81205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81205_01 - Canadian Western Trust|| FBUS|C20605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20605_01 - Van Tel/Safeway Employees Credit Union|| FBUS|C20152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20152_01 - Community First Credit Union|| FBUS|C20181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20181_01 - Dana Canada Employees (Ontario)|| FBUS|C20232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20232_01 - Ficanex Limited Partnership|| FBUS|C20257_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20257_11 - Federation des Caisses Desjardins du Quebec (FCDQ)|| FBUS|C20281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20281_01 - Greater Victoria Savings Credit Union|| FBUS|C20302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20302_01 - Horizon Credit Union|| FBUS|C20332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20332_01 - Iroquois Falls Community Credit Union|| FBUS|C20411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20411_01 - Nokomis Savings and Credit Union|| FBUS|C20421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20421_01 - Northland Savings and Credit Union Limited|| FBUS|C20482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20482_01 - RD Capital|| FBUS|C20518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20518_01 - Shibley Righton LLP|| FBUS|C20566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C20566_01 - Timmins Regional Credit Union Limited|| FBUS|C81879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81879_01 - Westoba Credit Union Ltd.|| FBUS|C21895_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C21895_03 - UBS AG|| FBUS|C81968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C81968_01 - Pace Savings & Credit Union Limited|| FBUS|C82258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C82258_01 - Buduchnist Credit Union|| FBUS|C82716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C82716_01 - Pentagon Federal Credit Union|| FBUS|C83059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83059_01 - First Credit Union|| FBUS|C83060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83060_01 - Northern Savings Credit Union|| FBUS|C83061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83061_01 - Rapport Credit Union|| FBUS|C83062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83062_01 - Sunova Credit Union|| FBUS|C83064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83064_01 - Union Bay Credit Union|| FBUS|C83054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83054_01 - Caisse Populaire Group Financier Ltee|| FBUS|C83055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83055_01 - Limestone Credit Union Ltd.|| FBUS|C83057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83057_01 - Coastal Community Credit Union|| FBUS|C83058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83058_01 - Communications Technologies Credit Union Limited|| FBUS|C83596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83596_01 - Groupe Dallaire|| FBUS|C83676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83676_01 - Ceskomoravska stavebni sporitelna, a.s.|| FBUS|C83759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83759_01 - BAPCO (Bellsouth Credit & Collections)|| FBUS|C83837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83837_01 - DaimlerChrysler Services Americas LLC|| FBUS|C83870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83870_01 - Equifax, Inc.|| FBUS|C83893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83893_01 - GE Consumer Finance (GE Capital)|| FBUS|C83995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C83995_01 - Navy Federal Credit Union|| FBUS|C84023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C84023_01 - PALO ROYALITIES|| FBUS|C84064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C84064_01 - SallieMae|| FBUS|C84279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C84279_01 - Tower Family Credit Union|| FBUS|C84280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C84280_01 - Knox County Teachers FCU|| FBUS|C84334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C84334_01 - La Federation Des Caisses Desjardins|| FBUS|C84378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FBUS_Att|C84378_01 - Services Financiers Peak|| Retail_Banking|FODU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FODU|C20183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20183_01 - Dell Financial Services|| FODU|C20183_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20183_02 - Dell Financial Services|| FODU|C20262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20262_01 - GE Capital|| FODU|C20262_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20262_02 - GE Capital|| FODU|C20262_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20262_03 - GE Capital|| FODU|C20824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20824_01 - Mercedes Benz Financial|| FODU|C20824_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20824_02 - Mercedes Benz Financial|| FODU|C20824_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20824_03 - Mercedes Benz Financial|| FODU|C21160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C21160_01 - John Deere Credit|| FODU|C21160_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C21160_02 - John Deere Credit|| FODU|C21844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C21844_01 - Honda Motors Credit|| FODU|C20619_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20619_02 - World Omni Financial|| FODU|C20619_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20619_03 - World Omni Financial|| FODU|C20619_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20619_04 - World Omni Financial|| FODU|C20638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20638_01 - Daimler Financial Services|| FODU|C20638_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20638_02 - Daimler Financial Services|| FODU|C20638_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20638_03 - Daimler Financial|| FODU|C20638_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20638_04 - Daimler Financial Services|| FODU|C20638_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20638_05 - Daimler Financial Services|| FODU|C22241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22241_01 - CCAF 18 de Septiembre|| FODU|C22242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22242_01 - CCAF La Araucana|| FODU|C22247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22247_01 - Coopeuch Ltda.|| FODU|C22256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22256_01 - Forum Servicios Financieros, Chile|| FODU|C22313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22313_01 - Eksport Kredit Fonden|| FODU|C22327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22327_01 - Notio Factoring A/S|| FODU|C29999_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C29999_12 - Other Sub Sector FODU|| FODU|C22085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22085_01 - Mantas Inc|| FODU|C22146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22146_01 - Riksgalden|| FODU|C22190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22190_01 - VR Leasing AG|| FODU|C22208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22208_01 - AFP Capital S.A.|| FODU|C22209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22209_01 - AFP Habitat S.A.|| FODU|C22210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22210_01 - AFP HORIZONTE S.A.|| FODU|C40355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C40355_01 - Volvofinans|| FODU|C40380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C40380_01 - Various FS|| FODU|C31784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C31784_01 - Volkswagen D'Ieteren Finance|| FODU|C60195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C60195_01 - MITSUI AUTO FINANCE PER? SA.|| FODU|C80195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C80195_01 - Volkswagen D'Ieteren Finance|| FODU|C80905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C80905_01 - AIC LEASING GMBH|| FODU|C81001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C81001_01 - VOLKSWAGEN FINANCIAL SERVICES|| FODU|C80362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C80362_01 - FCE Bank plc|| FODU|C80733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C80733_01 - Element Financial Corporation|| FODU|C81266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C81266_01 - AmericanHondaFinanceCorporation|| FODU|C81267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C81267_01 - DaimlerChryslerServices|| FODU|C22289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C22289_01 - Visa Argentina S.A.|| FODU|C20014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20014_01 - Affacturage|| FODU|C20087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20087_01 - BMW Financial Services|| FODU|C20891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20891_01 - Volksbank Bonn Rhein Sieg eG|| FODU|C40348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C40348_01 - Riksgalden|| FODU|C81338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C81338_01 - Toyota Credit Canada Inc.|| FODU|C20639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20639_01 - Peugeot Creditbank|| FODU|C20437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C20437_01 - Paccar Financial|| FODU|C10205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C10205_01 - GE Technology Finance|| FODU|C81946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C81946_01 - VW Credit Inc.|| FODU|C82043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C82043_01 - Toyota Credit Canada Inc.|| FODU|C82461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C82461_01 - Volvofinans Bank AB|| FODU|C82555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C82555_01 - American Honda Finance Corp|| FODU|C82817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FODU_Att|C82817_01 - VR Leasing AG|| Retail_Banking|FOFI|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FOFI|C20392_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C20392_02 - Moody's Investor Services|| FOFI|C20869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C20869_01 - Online Data Exchange|| FOFI|C20654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C20654_01 - Coface|| FOFI|C22311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22311_01 - Coface Finans A/S|| FOFI|C29999_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C29999_11 - Other Sub Sector FOFI|| FOFI|C21908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C21908_01 - American Stock Transfer & Trust Company|| FOFI|C22122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22122_01 - Other Financial Services|| FOFI|C22123_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_02 - OTHERS ACCOUNTS - BANK|| FOFI|C22123_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_03 - OTHERS ACCOUNTS - BANK|| FOFI|C22123_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_04 - OTHERS ACCOUNTS - BANK|| FOFI|C22123_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_05 - OTHERS ACCOUNTS - BANK|| FOFI|C22123_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_06 - OTHERS ACCOUNTS - BANK|| FOFI|C22123_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_07 - OTHERS ACCOUNTS - BANK|| FOFI|C22123_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_11 - OTHERS ACCOUNTS - BANK|| FOFI|C81254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C81254_01 - FORUM COMERCIALIZADORA DEL PERU|| FOFI|C22345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22345_01 - Orbitall Serviços e Processamento de Informações|| FOFI|C20883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C20883_01 - Experian|| FOFI|C21031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C21031_01 - CBCInnovis Inc.|| FOFI|C20486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C20486_01 - Reuters America|| FOFI|C20486_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C20486_02 - Reuters Australia|| FOFI|C20486_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C20486_03 - Reuters Group PLC|| FOFI|C10727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C10727_01 - TransUnion Canada|| FOFI|C82939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C82939_01 - New Management Services, LLC|| FOFI|C83395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C83395_01 - New Management Services, LLC|| FOFI|C22123_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C22123_13 - OTHERS ACCOUNTS - BANK|| FOFI|C83999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOFI_Att|C83999_01 - New Management Services, LLC|| Financial_Services|Commercial_and_Transaction|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Commercial and Transaction|| Commercial_and_Transaction|FCTB|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FCTB|C20304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20304_01 - HSBC|| FCTB|C20304_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20304_02 - HSBC|| FCTB|C20304_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20304_03 - HSBC|| FCTB|C20304_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20304_04 - HSBC|| FCTB|C20304_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20304_05 - HSBC|| FCTB|C20304_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20304_06 - HSBC|| FCTB|C20337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20337_01 - JP Morgan Chase|| FCTB|C20337_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20337_02 - JPMorgan Chase, National Association|| FCTB|C20337_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20337_03 - JPMorgan Chase & Co.|| FCTB|C20378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20378_01 - Mellon Bank|| FCTB|C20378_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20378_02 - Mellon Bank|| FCTB|C11154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C11154_01 - Royal Bank of Scotland|| FCTB|C20049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20049_01 - ANZ Bank|| FCTB|C20049_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20049_02 - ANZ Bank|| FCTB|C20066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20066_01 - Banco Do Brasil|| FCTB|C20066_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20066_02 - Banco do Brasil|| FCTB|C20066_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20066_03 - Banco do Brasil|| FCTB|C20071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20071_01 - Bank of America|| FCTB|C20071_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20071_02 - Bank of America|| FCTB|C20071_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20071_03 - Bank of America|| FCTB|C20071_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20071_04 - Bank of America|| FCTB|C20071_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20071_05 - Bank of America|| FCTB|C20071_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20071_06 - Bank of America|| FCTB|C20071_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20071_07 - BANK OF AMERICA|| FCTB|C20072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20072_01 - Bank of China|| FCTB|C20072_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20072_02 - Bank of China|| FCTB|C20072_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20072_03 - Bank of China|| FCTB|C20072_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20072_04 - Bank of China|| FCTB|C20073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20073_01 - Bank of Montreal|| FCTB|C20073_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20073_02 - Bank of Montreal|| FCTB|C20073_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20073_04 - Bank of Montreal|| FCTB|C20073_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20073_05 - Bank of Montreal|| FCTB|C20073_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20073_06 - Bank of Montreal|| FCTB|C20074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20074_01 - Bank of Nova Scotia|| FCTB|C20074_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20074_02 - Bank of Nova Scotia|| FCTB|C20074_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20074_04 - Bank of Nova Scotia|| FCTB|C20074_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20074_05 - Bank of Nova Scotia|| FCTB|C20074_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20074_06 - Bank of Novia Scotia BESS|| FCTB|C20074_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20074_07 - Bank of Nova Scotia|| FCTB|C20080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20080_01 - BDC - Banque de developpement du Canada (Corp. Project)|| FCTB|C20135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20135_01 - CIBC|| FCTB|C20135_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20135_02 - Canadian Imperial Bank of Commerce|| FCTB|C20135_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20135_03 - Canadian Imperial Bank of Commerce|| FCTB|C20135_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20135_04 - CIBC|| FCTB|C20135_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20135_05 - CIBC|| FCTB|C20135_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20135_06 - CIBC|| FCTB|C20135_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20135_07 - CIBC- BESS|| FCTB|C20138_18|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20138_18 - Citibank India|| FCTB|C20710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20710_01 - National Australia Group|| FCTB|C20714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20714_01 - Standard Chartered Bank|| FCTB|C20714_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20714_02 - Standard Chartered Bank|| FCTB|C20714_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20714_03 - Standard Chartered Bank|| FCTB|C20714_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20714_04 - Standard Chartered Bank|| FCTB|C20714_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20714_05 - Standard Chartered Bank|| FCTB|C20716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20716_01 - Commonwealth Bank of Australia|| FCTB|C20835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20835_01 - Nordea Bank Polska SA|| FCTB|C20839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20839_01 - BBVA|| FCTB|C20840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20840_01 - Australia and New Zealand Bank|| FCTB|C20840_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20840_02 - Australia and New Zealand Bank|| FCTB|C20902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20902_01 - ICICI Bank|| FCTB|C21040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21040_01 - Alberta Treasury Branch|| FCTB|C21122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21122_01 - Cibc Mellon|| FCTB|C21134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21134_01 - BDC - Banque de développement du Canada|| FCTB|C21134_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21134_02 - BDC - Banque de développement du Canada|| FCTB|C21134_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21134_03 - BDC - Banque de développement du Canada|| FCTB|C21134_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21134_04 - BDC - Banque de developpement du Canada|| FCTB|C21176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21176_01 - Commerzbank AG|| FCTB|C21799_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21799_07 - SMBC Capital India Private Limited|| FCTB|C21846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21846_01 - Bottomline Technologies|| FCTB|C20481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_01 - Royal Bank of Canada|| FCTB|C20481_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_04 - Royal Bank of Canada|| FCTB|C20481_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_05 - Royal Bank of Canada General Insurance|| FCTB|C20481_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_06 - Royal Bank of Canada General Insurance Global AP|| FCTB|C20481_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_07 - Royal Bank of Canada General Insurance Company|| FCTB|C20481_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_08 - Royal Bank of Canada|| FCTB|C20481_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_09 - Royal Bank of Canada|| FCTB|C20481_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20481_10 - Royal Bank of Canada|| FCTB|C20507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20507_01 - Scotiabank|| FCTB|C20507_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20507_02 - Bank of Nova Scotia ASP|| FCTB|C20580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20580_01 - U.S. Bancorp|| FCTB|C20599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20599_01 - US Bank|| FCTB|C20599_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20599_02 - US Bank|| FCTB|C20599_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20599_03 - US Bank|| FCTB|C20599_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20599_04 - US Bank|| FCTB|C20611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20611_01 - Wells Fargo Bank|| FCTB|C20611_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20611_02 - Wells Fargo Bank|| FCTB|C20611_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20611_03 - Wells Fargo Bank|| FCTB|C20611_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20611_04 - Wells Fargo Bank|| FCTB|C20611_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20611_05 - Wells Fargo Bank|| FCTB|C22233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22233_01 - BBVA- BANCO CONTINENTAL|| FCTB|C22234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22234_01 - BBVA Banco Francés S.A.|| FCTB|C22235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22235_01 - BBVA Colombia S.A.|| FCTB|C22237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22237_01 - BBVA Horizonte Pensiones Y Cesantias S.A.|| FCTB|C22238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22238_01 - BBVA Seguros Colombia SA|| FCTB|C22258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22258_01 - Gesfor Osmos Perú S.A. - BBVA Horizonte I (Mantenimiento)|| FCTB|C22299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22299_01 - National Commercial Bank|| FCTB|C22312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22312_01 - Danske Bank A/S|| FCTB|C22312_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22312_02 - Danske Bank A/S|| FCTB|C22331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22331_01 - Royal Bank of Scotland plc|| FCTB|C22331_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22331_02 - Royal Bank of Scotland plc|| FCTB|C22331_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22331_03 - Royal Bank of Scotland plc|| FCTB|C22331_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22331_04 - Royal Bank of Scotland plc|| FCTB|C22346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22346_01 - Union Bank of India|| FCTB|C21863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21863_01 - Royal Bank of Scotland|| FCTB|C21934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21934_01 - U.S. Bank Inc.|| FCTB|C21934_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21934_02 - U.S. Bank Inc.|| FCTB|C21940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21940_01 - AML and Payment Support and Maintenance|| FCTB|C21941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21941_01 - ANZ National Bank Limited|| FCTB|C21954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21954_01 - Bank of England|| FCTB|C21963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21963_01 - BBVA|| FCTB|C21968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21968_01 - BESS Clients (Saudi Arabia Banks)|| FCTB|C21980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_01 - CDC/CNP|| FCTB|C21980_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_02 - CDC/CNP|| FCTB|C21980_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_03 - CDC/CNP|| FCTB|C21980_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_04 - CDC/CNP|| FCTB|C21980_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_05 - CDC/CNP|| FCTB|C21980_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_06 - CDC/CNP|| FCTB|C21980_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_09 - CDC/CNP|| FCTB|C21980_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21980_12 - CDC/CNP|| FCTB|C21982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21982_01 - Central Bank of Bosnia|| FCTB|C21982_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21982_02 - Central Bank of Bosnia|| FCTB|C21984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21984_01 - Central Bank of Dominican Republic|| FCTB|C21985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21985_01 - Central Bank of Sri Lanka|| FCTB|C21985_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21985_02 - Central Bank of Sri Lanka|| FCTB|C21986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21986_01 - Central Bank of the Philippine|| FCTB|C21987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21987_01 - Central Bank of Trinidad & Tobago|| FCTB|C21987_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21987_02 - Central Bank of Trinidad & Tobago|| FCTB|C21988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21988_01 - Central Bank of Turkey|| FCTB|C21988_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21988_02 - Central Bank of Turkey|| FCTB|C21990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21990_01 - Ceska sporitelna|| FCTB|C21999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21999_01 - Commerzbank AG|| FCTB|C22005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22005_01 - Credit Suisse|| FCTB|C22008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22008_01 - Danske Bank|| FCTB|C22009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22009_01 - Danske Bank|| FCTB|C22009_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22009_02 - Danske Bank|| FCTB|C22043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22043_01 - Ghana International Bank plc|| FCTB|C22043_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22043_02 - Ghana International Bank plc|| FCTB|C22068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22068_01 - J.P. Morgan|| FCTB|C22069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22069_01 - JP Morgan|| FCTB|C22094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22094_01 - National Bank of Azerbaijan|| FCTB|C22096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22096_01 - National Bank of Croatia|| FCTB|C22096_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22096_02 - National Bank of Croatia|| FCTB|C22097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22097_01 - National Bank of Hungary|| FCTB|C22097_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22097_02 - National Bank of Hungary|| FCTB|C22098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22098_01 - National Bank of Slovakia|| FCTB|C22103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22103_01 - Nordea|| FCTB|C22143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22143_01 - Reserve Bank of Fiji|| FCTB|C22143_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22143_02 - Reserve Bank of Fiji|| FCTB|C22148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22148_01 - Royal Bank of Scotland|| FCTB|C22168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22168_01 - Standard Chartered Bank|| FCTB|C22193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22193_01 - Westpac New Zealand Limited|| FCTB|C22193_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22193_02 - Westpac New Zealand Limited|| FCTB|C31369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C31369_01 - Credit Suisse|| FCTB|C31682_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C31682_03 - Banco Central de la Rep. Dominicana|| FCTB|C80899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80899_01 - AAREAL BANK AG|| FCTB|C80900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80900_01 - ABC INTERNATIONAL BANK PLC|| FCTB|C80907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80907_01 - AXIS Bank (UK) Limited|| FCTB|C80909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80909_01 - BANCA COMERCIALA ROMANA SA|| FCTB|C80910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80910_01 - Banco Internacional do Funchal, S.A|| FCTB|C80911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80911_01 - Bank Leumi (UK) Limited|| FCTB|C80912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80912_01 - Bank of America|| FCTB|C80913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80913_01 - Bank of Beirut(UK)|| FCTB|C80915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80915_01 - BANK OF IRELAND TREASURY|| FCTB|C80916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80916_01 - BANK OF MONTREAL|| FCTB|C80917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80917_01 - BANK OF TOKYO MITSUBISHI|| FCTB|C80920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80920_01 - BRITISH ARAB COMMERCIAL BANK|| FCTB|C80921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80921_01 - Canadian Imperial Bank of Commerce|| FCTB|C80928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80928_01 - Close Brothers PLC|| FCTB|C80930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80930_01 - Credit Agricole Corporate & Investment|| FCTB|C80931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80931_01 - CROWN AGENTS BANK|| FCTB|C80932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80932_01 - DEPFA BANK|| FCTB|C80934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80934_01 - DEUTSCHE|| FCTB|C80935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80935_01 - Diamond Bank (UK)|| FCTB|C80943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80943_01 - FIRSTRAND IRELAND|| FCTB|C80947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80947_01 - HSBC BANK|| FCTB|C80948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80948_01 - ING BANK|| FCTB|C80950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80950_01 - INTESA SODITIC|| FCTB|C80952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80952_01 - JP MORGAN CHASE BANK|| FCTB|C80955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80955_01 - KOREAN EXCHANGE BANK|| FCTB|C80956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80956_01 - LANDZENTRALBANK|| FCTB|C80957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80957_01 - LYONNAISE DE BANQUE|| FCTB|C80958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80958_01 - MIZUHO CORPORATE BANK|| FCTB|C80961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80961_01 - National Bank of Kuwait (International)|| FCTB|C80962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80962_01 - NORDEA BANK FINLAND PLC|| FCTB|C80965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80965_01 - Permanent TSB|| FCTB|C80967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80967_01 - PORTIGON AG|| FCTB|C80970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80970_01 - Punjab National Bank (International)|| FCTB|C80975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80975_01 - RBS Invoice Finance Limited|| FCTB|C80978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80978_01 - SCOTIABANK EUROPE PLC|| FCTB|C80979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80979_01 - SG HAMBROS BANK|| FCTB|C80982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80982_01 - STANDARD BANK LONDON|| FCTB|C80984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80984_01 - STANDARD CHARTERED BANK|| FCTB|C80986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80986_01 - SUMITOMO TRUST & BANKING CORP.|| FCTB|C80989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80989_01 - T.C. ZIRAAT BANKASI|| FCTB|C80990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80990_01 - TESCO PERSONAL FINANCE|| FCTB|C80991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80991_01 - The Accountant in Bankruptcy|| FCTB|C80992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80992_01 - THE CHIBA BANK LTD|| FCTB|C80993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80993_01 - THE NORINCHUKIN BANK|| FCTB|C80995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80995_01 - Turkiye IS Bankasi A.S.|| FCTB|C80999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80999_01 - UNITED MIZRAHI BANK LTD|| FCTB|C81002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81002_01 - Westdeutsche ImmobilienBank AG|| FCTB|C81149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81149_01 - ANZ BGL Institutional|| FCTB|C81150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81150_01 - SIAM COMMERCIAL BANK|| FCTB|C81154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81154_01 - BANGKO SENTRAL NG PILIPINAS|| FCTB|C81155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81155_01 - Bank of Beirut(UK) Ltd|| FCTB|C80297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80297_01 - European Bank for Fund Services GmbH|| FCTB|C80500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80500_01 - Bank_of_New_York_Mellon|| FCTB|C80524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80524_01 - Danske_Bank|| FCTB|C80650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80650_01 - COMMONWEALTH BANK OF AUSTRALIA|| FCTB|C81183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81183_01 - FBME Bank Limited|| FCTB|C81192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81192_01 - CIBC Cash Management|| FCTB|C81200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81200_01 - Bayerische Landesbank|| FCTB|C81201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81201_01 - Landesbank Baden-Württemberg|| FCTB|C81231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81231_01 - CIMB Bank Berhad|| FCTB|C81231_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81231_02 - CIMB Bank Berhad|| FCTB|C81256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81256_01 - Banco de Crédito e Inversiones|| FCTB|C81269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81269_01 - HongkongAndShanghaiBankingCorporati|| FCTB|C81271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81271_01 - U.S.BankInc.|| FCTB|C81286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81286_01 - J.P.MorganIndiaPrivateLimited|| FCTB|C81307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81307_01 - IndusIndBankLimited|| FCTB|C81409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81409_01 - CREDIT LYONNAIS|| FCTB|C29999_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C29999_14 - Other Sub Sector FCTB|| FCTB|C80294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80294_01 - KfW Bankengruppe|| FCTB|C22093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22093_01 - NATIONAL AUSTRALIA BANK|| FCTB|C60321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C60321_01 - BBVA Gestion SGIIC|| FCTB|C31692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C31692_01 - BBVA Bancomer S.A.|| FCTB|C10556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C10556_01 - NAB - National Australia Bank Group|| FCTB|C81476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81476_01 - BBVA Colombia S.A.|| FCTB|C81477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81477_01 - BBVA Horizonte Pensiones Y Cesantias S.A.|| FCTB|C81478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81478_01 - BBVA Seguros Colombia SA|| FCTB|C81501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81501_01 - Industrial Development Bank of India Limited|| FCTB|C22220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22220_01 - BANCO DE CREDITO DEL PERU|| FCTB|C22225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22225_01 - BANCO INTERAMERICANO DE FINANZAS|| FCTB|C22236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22236_01 - BBVA Consolidar Seguros Sociedad|| FCTB|C22239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22239_01 - BBVA SEGUROS DE VIDA SA|| FCTB|C22260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22260_01 - HSBC BANK PERU SA.|| FCTB|C22287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22287_01 - ST���?NDAR CHARTERED BANK|| FCTB|C22326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22326_01 - Nordea A/S|| FCTB|C40337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C40337_01 - Danske Bank|| FCTB|C40343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C40343_01 - Nordea|| FCTB|C80613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80613_01 - Bank_of_England|| FCTB|C81186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81186_01 - ANZ BGL Institutional|| FCTB|C81203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81203_01 - Alberta Treasury Branch|| FCTB|C20598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20598_01 - US Bancorp|| FCTB|C20747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20747_01 - CDC|| FCTB|C81675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81675_01 - C81675_01 - Mizuho Corporate Bank Ltd.,|| FCTB|C81667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81667_01 - C81667_01 - Axis Bank|| FCTB|C81669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81669_01 - C81669_01 - Bank of Bahrain & Kuwait B.S.C.,|| FCTB|C81670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81670_01 - C81670_01 - Bank of India|| FCTB|C81672_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81672_01 - C81672_01 - ICICI Bank Ltd|| FCTB|C81674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81674_01 - C81674_01 - JP Morgon Chase Bank, N.A. - Mumbai|| FCTB|C81676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81676_01 - C81676_01 - State Bank of India|| FCTB|C81667_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81667_02 - C81667_01 - Axis Bank|| FCTB|C81670_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81670_02 - C81670_01 - Bank of India|| FCTB|C81672_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81672_02 - C81672_01 - ICICI Bank Ltd|| FCTB|C81674_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81674_02 - C81674_01 - JP Morgon Chase Bank, N.A. - Mumbai|| FCTB|C81676_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81676_03 - C81676_01 - State Bank of India|| FCTB|C22005_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C22005_02 - Credit Suisse AG|| FCTB|C81782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81782_01 - SVEA FINANS AS|| FCTB|C80921_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80921_02 - Canadian Imperial Bank of Commerce|| FCTB|C80943_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80943_02 - Firstrand LTD (First National Bank SA)|| FCTB|C21934_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C21934_03 - U.S. Bank Inc.|| FCTB|C81948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81948_01 - Kenya Commercial Bank Limited|| FCTB|C81952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81952_01 - IDBI Bank Ltd|| FCTB|C31369_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C31369_02 - Credit Suisse Group AG|| FCTB|C20337_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20337_04 - JPMorgan Chase & Co.|| FCTB|C81979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C81979_01 - REGIME EMPLOY?S FBN|| FCTB|C82018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82018_01 - Canadian Imperial Bank of Commerce|| FCTB|C82041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82041_01 - JP MORGAN CHASE|| FCTB|C82290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82290_01 - ATBFinancial|| FCTB|C20057_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20057_02 - ATB Financial|| FCTB|C20057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C20057_01 - ATB Financial|| FCTB|C82287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82287_01 - Ceskoslovenska obchodna banka, a.s.|| FCTB|C82376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82376_01 - JP MORGAN CHASE BANK|| FCTB|C82388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82388_01 - MELLON BANK|| FCTB|C82456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82456_01 - Nordea Finans Sverige AB|| FCTB|C82530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82530_01 - Nordea|| FCTB|C82543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82543_01 - HSBC|| FCTB|C82576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82576_01 - Zions Management Services Company|| FCTB|C82788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82788_01 - DISTINCTION CAPITAL INC.|| FCTB|C82852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82852_01 - CIBC|| FCTB|C82853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82853_01 - Credit Suisse|| FCTB|C82952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82952_01 - Bank of America North America|| FCTB|C82994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C82994_01 - ANZ BANKING CORPORATION|| FCTB|C83124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83124_01 - Banca Nazionale del Lavoro S.p.A.|| FCTB|C83132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83132_01 - Macquarie Equipment Finance Ltd|| FCTB|C83162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83162_01 - JP MORGAN CHASE BANK|| FCTB|C83249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83249_01 - HSBC FRANCE|| FCTB|C83290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83290_01 - HSBC|| FCTB|C83425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83425_01 - Nomura International|| FCTB|C83458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83458_01 - Synchrony Financial|| FCTB|C83493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83493_01 - Citizens Financial Group, Inc.|| FCTB|C83502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83502_01 - First National Bank - PA|| FCTB|C83615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83615_01 - Norddeutsche Landesbank Girozentrale|| FCTB|C83678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83678_01 - Vseobecna uverova banka, a.s.|| FCTB|C83679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83679_01 - MONETA Money Bank, a.s.|| FCTB|C83755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83755_01 - Bank of America|| FCTB|C83756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83756_01 - Bank of Montreal|| FCTB|C83757_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C83757_01 - Bank of Nova Scotia|| FCTB|C84061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84061_01 - Royal Bank of Canada|| FCTB|C84133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84133_01 - U.S. Bancorp|| FCTB|C84173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84173_01 - Zions Management Services Company|| FCTB|C84330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84330_01 - Bank of Nova Scotia|| FCTB|C84331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84331_01 - Royal Bank of Canada|| FCTB|C84344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84344_01 - Clydesdale Bank PLC|| FCTB|C84415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84415_01 - U.S. Bank Inc.|| FCTB|C84377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C84377_01 - Conseil Quebecois Cooperation et Mutualite|| Commercial_and_Transaction|FOPR|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FOPR|C10002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C10002_01 - Wirecard AG|| FOPR|C20162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20162_01 - Celero Solutions|| FOPR|C20221_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20221_02 - Everlink Payment|| FOPR|C20237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20237_01 - Financial Linx|| FOPR|C20237_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20237_02 - Financial Linx|| FOPR|C20261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20261_01 - GC Services|| FOPR|C20261_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20261_02 - GC Services|| FOPR|C20261_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20261_03 - GC Services|| FOPR|C20323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20323_01 - Interac Inc.|| FOPR|C20323_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20323_02 - Interac Inc.|| FOPR|C20326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20326_01 - Intria Item|| FOPR|C20326_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20326_02 - Intria Item|| FOPR|C20340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20340_01 - Keidata BAck Office Solutions Inc.|| FOPR|C20353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20353_01 - League Data Limited / CUCNS|| FOPR|C20353_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20353_02 - League Data Limited / CUCNS|| FOPR|C20373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20373_01 - MCAP (Otera Capital)|| FOPR|C20373_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20373_02 - MCAP|| FOPR|C20373_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20373_03 - MCAP|| FOPR|C11083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C11083_01 - PAYONE GmbH & Co. KG|| FOPR|C11176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C11176_01 - APACS|| FOPR|C20011_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20011_02 - Acxsys Corp|| FOPR|C20011_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20011_03 - Acxsys|| FOPR|C20106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20106_01 - Canadian Payments Association|| FOPR|C20106_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20106_03 - Canadian Payments Association|| FOPR|C20106_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20106_04 - Canadian Payments Association|| FOPR|C20120_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20120_03 - Celero|| FOPR|C20766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20766_01 - La Capitale - gestion financière|| FOPR|C20766_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20766_02 - Capitale Gestion Financière Inc, La|| FOPR|C20766_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20766_03 - Capitale Gestion Financière Inc, La|| FOPR|C20822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20822_01 - LCH Clearnet Limited|| FOPR|C20981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20981_01 - IBS Processing DMS|| FOPR|C21007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21007_01 - Resolve / Edulinx|| FOPR|C21007_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21007_02 - Resolve / Edulinx|| FOPR|C21007_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21007_03 - Resolve / Edulinx|| FOPR|C21168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21168_01 - Krajowa Izba Rozliczen S.A.|| FOPR|C21807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21807_01 - Beanstream Internet Commerce Inc.|| FOPR|C21828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21828_01 - GFKL Financial Services|| FOPR|C21838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21838_01 - Verifone|| FOPR|C20440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20440_01 - Paradigm Quest Inc.|| FOPR|C29999_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C29999_13 - Other Sub Sector FOPR|| FOPR|C21902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21902_01 - Altisource Business (P) LTD.|| FOPR|C22011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C22011_01 - De Lage Landen Finans|| FOPR|C22034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C22034_01 - First Data Deutschland GmbH|| FOPR|C22037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C22037_01 - Forex|| FOPR|C22058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C22058_01 - IKANO-banken|| FOPR|C22171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C22171_01 - Suomen Luotto-osuuskunta|| FOPR|C51647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C51647_01 - TRAVELEX OUTSOURCING PTY LTD|| FOPR|C52240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C52240_01 - ReadSoft AS|| FOPR|C70387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C70387_01 - Kreditorforening Vest|| FOPR|C80939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C80939_01 - Euronet Worldwide|| FOPR|C80586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C80586_01 - Rural_Payments_Agency|| FOPR|C80634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C80634_01 - Paymaster_(1836)|| FOPR|C80722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C80722_01 - ACCORDFIN Espana|| FOPR|C81227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81227_01 - DataCore Fund Services Inc.|| FOPR|C81353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81353_01 - Clearing & Payment Services Pte Ltd|| FOPR|C22188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C22188_01 - Venantius|| FOPR|C40338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C40338_01 - De Lage Landen Finans|| FOPR|C40354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C40354_01 - Venantius|| FOPR|C40377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C40377_01 - Forex|| FOPR|C40378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C40378_01 - IKANO-banken|| FOPR|C20903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20903_01 - Polcard SA|| FOPR|C21006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C21006_01 - Resolve Corporation|| FOPR|C80901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C80901_01 - ACI Worldwide|| FOPR|C80937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C80937_01 - Equens SE|| FOPR|C81356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81356_01 - Ingenico France|| FOPR|C81431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81431_01 - EVERTEC INC|| FOPR|C20231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20231_01 - Felcom Data Services Inc.|| FOPR|C20521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20521_01 - Sourcecheck Ltd|| FOPR|C20543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C20543_01 - Symcor|| FOPR|C10717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C10717_01 - Equimac Inc.|| FOPR|C10935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C10935_01 - Hypercom|| FOPR|C11039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C11039_01 - D and H Ltd|| FOPR|C22075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C22075_01 - KrediNor|| FOPR|C81627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81627_01 - FDE-holding A/S|| FOPR|C81736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81736_01 - AKTUA Soluciones Financieras|| FOPR|C81774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81774_01 - Lindorff AS|| FOPR|C81783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81783_01 - ReadSoft Norge AS|| FOPR|C81786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81786_01 - Fair Isaac Services Limited|| FOPR|C81794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81794_01 - Bacs Payment Schemes Ltd|| FOPR|C81867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81867_01 - National Automated Clearing House Association|| FOPR|C81956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81956_01 - Payments Council Ltd|| FOPR|C81957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C81957_01 - Faster Payments Limited|| FOPR|C82172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82172_01 - TCI ePay/TCI Business Capital, Inc.|| FOPR|C82176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82176_01 - TransUnion Canada|| FOPR|C82199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82199_01 - 3Step IT Oy|| FOPR|C82259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82259_01 - League Data Limited|| FOPR|C82410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82410_01 - Australian Settlements Limited|| FOPR|C82491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82491_01 - CCV|| FOPR|C82691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82691_01 - EVERTEC Group, LLC|| FOPR|C82764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82764_01 - ACI Worldwide|| FOPR|C80926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FCTB_Att|C80926_01 - CHEQUE & CREDIT CLEARING COMPANY|| FOPR|C83131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C83131_01 - TransUnion Canada|| FOPR|C83243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C83243_01 - CURRENCY SELECT PTY LTD|| FOPR|C83332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C83332_01 - EnterCard|| FOPR|C83333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C83333_01 - EnterCard|| FOPR|C83334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C83334_01 - EnterCard|| FOPR|C83419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C83419_01 - National Automated Clearing House Association|| FOPR|C83563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C83563_01 - SIBS - Forward Payment Solutions|| FOPR|C84402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C84402_01 - DataCore Fund Services Inc.|| Financial_Services|Insurance|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Insurance|FIAB|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FIAB|C20345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20345_01 - Knapp Schenck / Massamont|| FIAB|C20404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20404_01 - National Grange|| FIAB|C20404_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20404_02 - National Grange|| FIAB|C11174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C11174_01 - AON Limited|| FIAB|C11175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C11175_01 - AON Limited|| FIAB|C20055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20055_01 - Arrowhead (Claims Managment)|| FIAB|C20055_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20055_02 - Arrowhead (General Insurance IT)|| FIAB|C20055_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20055_03 - Arrowhead (General Insurance Policy)|| FIAB|C20055_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20055_04 - Arrowhead (DMS)|| FIAB|C20146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20146_01 - College Highway Insurance|| FIAB|C20146_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20146_02 - College Highway Insurance|| FIAB|C20814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20814_01 - Churchill Management Limited|| FIAB|C20887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20887_01 - Arista Insurance|| FIAB|C21817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21817_01 - NGM Insurance Company|| FIAB|C21817_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21817_02 - NGM Insurance Company|| FIAB|C20510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20510_01 - Seabury and Smith|| FIAB|C20535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20535_01 - STG (DMS)|| FIAB|C20565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20565_01 - TIG|| FIAB|C20565_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20565_02 - TIG|| FIAB|C20614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20614_01 - Westwood Insurance Agency Bureau|| FIAB|C20614_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20614_02 - Westwood Insurance Agency Bureau|| FIAB|C22257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22257_01 - GALICIA SEGUROS SA|| FIAB|C22262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22262_01 - ING Seguros de Vida|| FIAB|C22280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22280_01 - PACIFICO PERUANO SUIZA|| FIAB|C22293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22293_01 - Direct Line|| FIAB|C22338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22338_01 - KennCo Underwriting Limited|| FIAB|C22352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22352_01 - Sigma Assurances et Services Financiers Inc.|| FIAB|C22353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22353_01 - AG Insurance|| FIAB|C22354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22354_01 - Acerta|| FIAB|C29999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C29999_03 - Other Sub Sector FIAB|| FIAB|C21878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21878_01 - Ecclesiastical Insurance Group|| FIAB|C21886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21886_01 - Appalachian Underwriters Inc.|| FIAB|C21913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21913_01 - Middle Oak Insurance Company|| FIAB|C21943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21943_01 - AON Limited|| FIAB|C22045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22045_01 - GPU|| FIAB|C22063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22063_01 - Insurance Database Services Ltd|| FIAB|C22065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_01 - IPR|| FIAB|C22065_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_02 - IPR|| FIAB|C22065_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_03 - IPR|| FIAB|C22065_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_04 - IPR|| FIAB|C22065_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_05 - IPR|| FIAB|C22065_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_06 - IPR|| FIAB|C22065_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_07 - IPR|| FIAB|C22065_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_09 - IPR|| FIAB|C22065_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_11 - IPR|| FIAB|C22065_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_12 - IPR|| FIAB|C22088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22088_01 - Max matthissen|| FIAB|C22136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22136_01 - QBE Management Services (UK) Ltd|| FIAB|C22150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22150_01 - Salus Ansvar|| FIAB|C22178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22178_01 - Trafikforsakringsforeningen|| FIAB|C80906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C80906_01 - AON|| FIAB|C80944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C80944_01 - Footprint Underwriting Limited|| FIAB|C80980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C80980_01 - Shelbourne Syndicate Services|| FIAB|C80717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C80717_01 - Suomen Vahinkotarkastus SVT Oy|| FIAB|C81308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C81308_01 - CanopiusManagingAgentsLimited|| FIAB|C81308_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C81308_02 - CanopiusManagingAgentsLimited|| FIAB|C81475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C81475_01 - Johnston Group|| FIAB|C22265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22265_01 - INTERSEGURO COMPA?IA DE SEGUROS SA|| FIAB|C22271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22271_01 - Mapfre La Seguridad Venezuela, C.A. de Seguros|| FIAB|C22272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22272_01 - Mercantil Seguros, C.A.|| FIAB|C22274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22274_01 - Metlife Colombia Seguros De Vida S.A.|| FIAB|C22281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22281_01 - PACIFICO SA. EPS|| FIAB|C22282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22282_01 - QBE ART S.A.|| FIAB|C22284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22284_01 - Seguros Provincial, C.A.|| FIAB|C31789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C31789_01 - Travelers Canada|| FIAB|C40369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C40369_01 - Salus Ansvar|| FIAB|C40373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C40373_01 - Trafikforsakringsforeningen|| FIAB|C20004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20004_01 - A.H. Rist Insurance Agency|| FIAB|C20025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20025_01 - Allmas John Fernekee Insurance|| FIAB|C20048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20048_01 - Anchor Managing General Agency Inc.|| FIAB|C20048_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20048_02 - Anchor Managing General Agency Inc.|| FIAB|C20050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20050_01 - Aon Reed Steenhouse|| FIAB|C20050_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20050_02 - Aon Reed Steenhouse|| FIAB|C20050_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20050_03 - Aon|| FIAB|C20092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20092_01 - Bradshaw Insurance Agency|| FIAB|C20115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20115_01 - Cassidy Associates Insurance|| FIAB|C20122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20122_01 - Central Sqaure Insurance|| FIAB|C20136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20136_01 - Circle Insurance|| FIAB|C20137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20137_01 - Circle Insurance Agency|| FIAB|C20906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20906_01 - Preferred Managing Agency|| FIAB|C20910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20910_01 - 878 Auto Body|| FIAB|C20911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20911_01 - A and B Automatic Transmission|| FIAB|C20912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20912_01 - A-1 Auto Body|| FIAB|C20913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20913_01 - Abe's Auto Center Inc.|| FIAB|C20914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20914_01 - Albany - Information Technology|| FIAB|C20915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20915_01 - Alden Buick-Pontiac-GMC|| FIAB|C20916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20916_01 - Amaral and Gallagher Insurance|| FIAB|C20918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20918_01 - Amigo Auto Care|| FIAB|C20919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20919_01 - Andrew Philbin Insurance Agency|| FIAB|C20920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20920_01 - Aqua-Rock Service Station Inc.|| FIAB|C20921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20921_01 - ATS LLC T/A Roth Auto Coach Works|| FIAB|C20922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20922_01 - Auto Credit|| FIAB|C20923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20923_01 - Auto Master Paint and Body Works|| FIAB|C20924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20924_01 - Auto Tech Collision II|| FIAB|C20925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20925_01 - Balmville Collision|| FIAB|C20926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20926_01 - Beatrice Insurance Company|| FIAB|C20927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20927_01 - Benevento Insurance Company|| FIAB|C20928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20928_01 - Bethford Auto and Tires (CITGO)|| FIAB|C20929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20929_01 - Bob's Auto Repair|| FIAB|C20930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20930_01 - Body Art Collision Center|| FIAB|C20931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20931_01 - Borden Insurance Agency|| FIAB|C20932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20932_01 - Brick Shell|| FIAB|C20933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20933_01 - Brooks-Neylon Insurance Agency|| FIAB|C20934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20934_01 - Brookwood Auto Body|| FIAB|C20935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20935_01 - Brown's Automotive|| FIAB|C20936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20936_01 - C and M Customizing and Collision|| FIAB|C20937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20937_01 - CH Insurance Agency|| FIAB|C20938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20938_01 - Cafeway Towing|| FIAB|C20939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20939_01 - Car Star Collision|| FIAB|C20940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20940_01 - Charles Phykitt Insurance Agnecy|| FIAB|C20941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20941_01 - City Auto Collision|| FIAB|C20942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20942_01 - Collins Auto Inc. T/A Collex Collision|| FIAB|C20943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20943_01 - ColorMyCar Inc.|| FIAB|C20944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20944_01 - Commercial Collision|| FIAB|C20945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20945_01 - Complete Auto Body Shop Inc.|| FIAB|C20946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20946_01 - Corby's Collision Inc.|| FIAB|C20947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20947_01 - Cotterill Agency Inc.|| FIAB|C20948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20948_01 - Country Club Service|| FIAB|C20949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20949_01 - Court Street Insurance Agency|| FIAB|C20950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20950_01 - Crimmins / Graveline Insurance Agency|| FIAB|C20951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20951_01 - Crowler Donovan Insurance Agency|| FIAB|C20952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20952_01 - Curley Insurance Agency|| FIAB|C20953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20953_01 - D.H. Smith Insurance Agency|| FIAB|C20954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20954_01 - Dan's Auto Restoration|| FIAB|C20955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20955_01 - Delong Auto Body|| FIAB|C20956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20956_01 - Direct Auto Market|| FIAB|C20957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20957_01 - Don and Wally's Service Center|| FIAB|C20958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20958_01 - Eastern Long Island Automotive|| FIAB|C20959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20959_01 - Elies Sunoco Auto Center|| FIAB|C20960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20960_01 - Elite Auto Collision|| FIAB|C20961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20961_01 - Elite Body Works Inc.|| FIAB|C20962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20962_01 - Epic Auto Leasing LLC T/A Epic Car Truck|| FIAB|C20964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20964_01 - F and F Auto Glass|| FIAB|C20965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20965_01 - Factory Collisions and Restoration Inc.|| FIAB|C20966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20966_01 - Faggioli's Auto Body|| FIAB|C20967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20967_01 - Felix Auto Body|| FIAB|C20968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20968_01 - Field, Eddy and Buckley Inc.|| FIAB|C20969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20969_01 - Four Brothers Auto Center|| FIAB|C20970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20970_01 - Frank Body Works|| FIAB|C20971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20971_01 - Gene's Automotive & Body Shop|| FIAB|C20972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20972_01 - Gillen's Expert Auto Inc.|| FIAB|C20973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20973_01 - Glaub's Collision|| FIAB|C20974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20974_01 - Grafton Street Mobil|| FIAB|C20975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20975_01 - Greene Street Auto Body|| FIAB|C20976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20976_01 - Harold's Auto Center|| FIAB|C20977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20977_01 - Henley Enterprises Inc.|| FIAB|C20978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20978_01 - Hermi's Friendly Service|| FIAB|C20979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20979_01 - Hitman Collision|| FIAB|C20980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20980_01 - Holman Lincoln Mercury|| FIAB|C20982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20982_01 - Imagistics International DMS|| FIAB|C20983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20983_01 - Inspire DMS|| FIAB|C20984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20984_01 - J.M. Auto Sales|| FIAB|C20985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20985_01 - John Russel Insurance Agency|| FIAB|C20986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20986_01 - JRM Auto Service|| FIAB|C20987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20987_01 - Kerrie Staite|| FIAB|C20988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20988_01 - Kevin's Auto Body|| FIAB|C20989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20989_01 - Lincoln Auto Body|| FIAB|C20990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20990_01 - Lord and Son Auto Body|| FIAB|C20991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20991_01 - M and R Motors|| FIAB|C20992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20992_01 - Mike's Auto Body|| FIAB|C20993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20993_01 - Mystic Street Gulf|| FIAB|C20994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20994_01 - New Angle Glass|| FIAB|C20995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20995_01 - Nor-Bay Service Center Inc.|| FIAB|C20996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20996_01 - Pike Insurance Agency|| FIAB|C20997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20997_01 - Thomas A Cocco Insurance Agency|| FIAB|C20998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20998_01 - Tony's Automotive Repair Shop|| FIAB|C20999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20999_01 - Triple A Auto Service|| FIAB|C21000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21000_01 - Vermette and Bates Insurance Agency|| FIAB|C21001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21001_01 - W.F. Logan Insurance Agency|| FIAB|C21002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21002_01 - IL Fairplan|| FIAB|C21003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21003_01 - Imperial Collision|| FIAB|C21045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21045_01 - Knox Colllision Center LLC|| FIAB|C21046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21046_01 - Kraus's Auto Body|| FIAB|C21047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21047_01 - L A S Truck and Auto|| FIAB|C21048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21048_01 - Larry's Service Center|| FIAB|C21049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21049_01 - Lav's Auto Body and Sales|| FIAB|C21051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21051_01 - Long Radio|| FIAB|C21052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21052_01 - Lukoil|| FIAB|C21053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21053_01 - Lusignan's Auto Body|| FIAB|C21054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21054_01 - Lyons Collision|| FIAB|C21055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21055_01 - Mahopac Collision|| FIAB|C21056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21056_01 - Manny's Auto Body|| FIAB|C21057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21057_01 - Merrick Collision|| FIAB|C21058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21058_01 - Methuen Gulf|| FIAB|C21059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21059_01 - Miami Auto Styles|| FIAB|C21060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21060_01 - Michael J. Lauro Insurance|| FIAB|C21062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21062_01 - Midas|| FIAB|C21063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21063_01 - Midway Auto Collision|| FIAB|C21064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21064_01 - Millenium 3000 Auto Center|| FIAB|C21065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21065_01 - Miser Auto Rentals|| FIAB|C21066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21066_01 - Natl Auto Dealers Assoc|| FIAB|C21067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21067_01 - Nerger's Auto Express (NAPA)|| FIAB|C21068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21068_01 - Nick Velardi Service Station|| FIAB|C21069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21069_01 - Nino's Getty|| FIAB|C21070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21070_01 - Nor-Bartow Service Center Inc.|| FIAB|C21071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21071_01 - North Amherst Motors|| FIAB|C21072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21072_01 - North End Motor Sales|| FIAB|C21073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21073_01 - Northeast Etc|| FIAB|C21074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21074_01 - One Stop Automotive Specialty|| FIAB|C21075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21075_01 - Petrella Bros Auto Body Inc.|| FIAB|C21076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21076_01 - Phil's Auto Body|| FIAB|C21077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21077_01 - Plaza Auto Body Inc.|| FIAB|C21078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21078_01 - Premier Auto Installation Inc.|| FIAB|C21079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21079_01 - R and R Auto Center|| FIAB|C21080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21080_01 - Ramapo Auto Body Inc.|| FIAB|C21081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21081_01 - Ramsey Auto Service|| FIAB|C21082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21082_01 - Ron's Service Center|| FIAB|C21083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21083_01 - Rosales Tires and Auto Service|| FIAB|C21084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21084_01 - Rte 114 Gulf|| FIAB|C21085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21085_01 - S and M Service Center|| FIAB|C21086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21086_01 - Savvy Systems Ltd|| FIAB|C21087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21087_01 - Seng's Auto Body|| FIAB|C21088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21088_01 - Sensible Car Rental|| FIAB|C21089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21089_01 - Serafini Nissan-Volvo Body Shop|| FIAB|C21090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21090_01 - Smith Auto Sales|| FIAB|C21091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21091_01 - Smith Nest Collision|| FIAB|C21092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21092_01 - Soderberg Insurance Agency|| FIAB|C21093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21093_01 - Softek|| FIAB|C21094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21094_01 - South Shore Auto|| FIAB|C21095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21095_01 - Speedee Oil Change and Tune Up|| FIAB|C21096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21096_01 - Springfield Inspection|| FIAB|C21097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21097_01 - Star Auto Stores|| FIAB|C21098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21098_01 - Statewide Collision Repair Inc.|| FIAB|C21099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21099_01 - Steve Meier|| FIAB|C21100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21100_01 - Steven McGrath Insurance Agency|| FIAB|C21101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21101_01 - Suburban Auto Body|| FIAB|C21102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21102_01 - Teece's Collision and Frame|| FIAB|C21103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21103_01 - Tex Star Service Station|| FIAB|C21104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21104_01 - The Painter Auto Body|| FIAB|C21105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21105_01 - Toons Unlimited|| FIAB|C21106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21106_01 - Trail Auto Body - Palm Beach Auto|| FIAB|C21107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21107_01 - Triumph Auto Glass|| FIAB|C21108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21108_01 - Usa Speedee Auto and Tire Center|| FIAB|C21110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21110_01 - Valvoline|| FIAB|C21111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21111_01 - Van Houten Auto Body|| FIAB|C21112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21112_01 - Village Automotive Center|| FIAB|C21113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21113_01 - W Hagerthey's Repair Shop|| FIAB|C21114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21114_01 - Warilas Auto Body|| FIAB|C21115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21115_01 - Wellesley Hills Gulf|| FIAB|C21116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21116_01 - West Boylston Getty|| FIAB|C21117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21117_01 - Weston Sunoco Service Station|| FIAB|C21118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21118_01 - William McAuliffe Agency|| FIAB|C21119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21119_01 - Worcester Radio and Speedometer|| FIAB|C21899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21899_01 - Macifilia|| FIAB|C21921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21921_01 - Maryland Casualty Company|| FIAB|C21925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21925_01 - Farmers Mutual Insurance Company (Lindsay)|| FIAB|C21929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21929_01 - Marsh Canada Limited|| FIAB|C21942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C21942_01 - AON|| FIAB|C22086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22086_01 - MAPFRE|| FIAB|C81247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C81247_01 - Lussier Cabinet d'assurances et services financier|| FIAB|C20182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20182_01 - DeAngelis Insurance Agency|| FIAB|C20195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20195_01 - DMS - Internal Project|| FIAB|C20203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20203_01 - East Douglas Insurance Agency|| FIAB|C20216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20216_01 - Equinox|| FIAB|C20245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20245_01 - Flaherty Insurance Agency|| FIAB|C20253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20253_01 - Francis Provencher Insurance|| FIAB|C20258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20258_01 - Gallagher Bassett - San Diego|| FIAB|C20259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20259_01 - Gallant Insurance Agency Inc.|| FIAB|C20279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20279_01 - Gowen and Trombly Insurance|| FIAB|C20289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20289_01 - H.H. Warren Insurance Agency|| FIAB|C20293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20293_01 - Hanson Insurance|| FIAB|C20297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20297_01 - Harvey F. Doren Insurance Agency|| FIAB|C20298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20298_01 - Herliny Insurance Group|| FIAB|C20305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20305_01 - Hudson-Eldridge Insurance Agency|| FIAB|C20308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20308_01 - IBS - Internal Project|| FIAB|C20336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20336_01 - John J. Insurance Agency|| FIAB|C20346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20346_01 - Knight-Dik Insurance Agency|| FIAB|C20347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20347_01 - L and J Service|| FIAB|C20348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20348_01 - L.E. Mahoney Insurance Agency Inc.|| FIAB|C20351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20351_01 - Laporte Shea and Borys Insurance|| FIAB|C20354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20354_01 - Lewis Bither Insurance Agency|| FIAB|C20359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20359_01 - Lindsey General Insurance Agency|| FIAB|C20366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20366_01 - Macshawson Insurance Agency|| FIAB|C20372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20372_01 - Massamont Insurance Agency|| FIAB|C20394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20394_01 - Moulton Insurance Agency Inc.|| FIAB|C20434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20434_01 - OS Acquisitions Corporation|| FIAB|C20446_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20446_02 - Pearl|| FIAB|C20455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20455_01 - Phillips Insurance Agency|| FIAB|C20456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20456_01 - Picken Insurance Agency|| FIAB|C20485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20485_01 - Remillard Insurance Agency|| FIAB|C20497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20497_01 - RPC Insurance Agency LLC|| FIAB|C20515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20515_01 - Shannon Agency|| FIAB|C20520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20520_01 - Skole Insurance Agency|| FIAB|C20560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20560_01 - The Stone Agency|| FIAB|C20561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20561_01 - The William T. Flynn Insurance Agency|| FIAB|C20568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C20568_01 - Tomlinson and O'Neil Insurance|| FIAB|C40366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C40366_01 - Max matthissen|| FIAB|C80260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C80260_01 - Exigen|| FIAB|C10436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C10436_01 - Softek|| FIAB|C10436_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C10436_03 - Softek|| FIAB|C81684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C81684_01 - C81684_01 - Angus-Miller Ltd.|| FIAB|C82829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C82829_01 - AON RISK SERVICES AUSTRALIA LIMITED|| FIAB|C82976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C82976_01 - WESTWOOD INSURANCE AGENCY BUREAU|| FIAB|C82978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C82978_01 - WESTWOOD INSURANCE AGENCY BUREAU|| FIAB|C82980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C82980_01 - WESTWOOD INSURANCE AGENCY BUREAU|| FIAB|C83063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C83063_01 - The Bloom Group|| FIAB|C83286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C83286_01 - Insurance Australia Limited|| FIAB|C83375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C83375_01 - Achmea Canada|| FIAB|C22065_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C22065_13 - IPR|| FIAB|C83442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C83442_01 - IPR|| FIAB|C83447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C83447_01 - Marsh & McLennan Companies, Inc|| FIAB|C83483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C83483_01 - Arbella Insurance|| FIAB|C84004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C84004_01 - NGM Insurance Company|| FIAB|C84072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C84072_01 - Seabury & Smith|| FIAB|C84184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C84184_01 - Middle Oak Insurance Company|| FIAB|C84354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIAB_Att|C84354_01 - Youngs Insurance Brokers Inc|| Insurance|FILI|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FILI|C20154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20154_01 - Compagnie d'Assurance Standard Life|| FILI|C20154_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20154_02 - Standard Life|| FILI|C20154_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20154_03 - Standard Life|| FILI|C20163_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20163_03 - Cooperators Life Insurance Company|| FILI|C20226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20226_01 - Farm Family Insurance|| FILI|C20226_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20226_02 - Farm Family Insurance|| FILI|C20234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20234_01 - DSF - Desjardins Sécurité Financière|| FILI|C20234_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20234_02 - DSF - Desjardins Sécurité Financière|| FILI|C20234_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20234_03 - DSF - Desjardins Sécurité Financière|| FILI|C20234_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20234_04 - DSF - Desjardins Sécurité Financière|| FILI|C20234_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20234_05 - DSF - Desjardins Sécurité Financière|| FILI|C20234_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20234_06 - DSF - Desjardins Sécurité Financière|| FILI|C20234_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20234_08 - DSF - Desjardins Sécurité Financière|| FILI|C20250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20250_01 - Foresters - Op Framework|| FILI|C20250_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20250_02 - Foresters|| FILI|C20250_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20250_03 - Foresters|| FILI|C20250_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20250_04 - Foresters|| FILI|C20317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_01 - Industrial Alliance|| FILI|C20317_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_03 - Industrial Alliance|| FILI|C20317_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_04 - Industrial Alliance|| FILI|C20317_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_05 - Industrial Alliance|| FILI|C20317_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_06 - Industrial Alliance Assurance|| FILI|C20317_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_07 - Industrial Alliance|| FILI|C20317_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_09 - Industrial Alliance|| FILI|C20317_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_10 - Industrial Alliance|| FILI|C20317_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_11 - Industrial Alliance|| FILI|C20317_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20317_12 - Industrial Alliance Assurance|| FILI|C20331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20331_01 - Iowa Farm Bureau Federation|| FILI|C20368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20368_01 - Manulife - John Hancock|| FILI|C20368_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20368_02 - Manulife - John Hancock|| FILI|C20368_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20368_03 - Manulife - John Hancock|| FILI|C20368_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20368_04 - Manulife Financial|| FILI|C20368_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20368_05 - Manulife Financial|| FILI|C20368_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20368_06 - John Hancock-US|| FILI|C11113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C11113_01 - Chartis Europe Limited|| FILI|C11151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C11151_01 - Prudential plc|| FILI|C11168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C11168_01 - THE ROYAL LONDON MUTUAL INSURANCE SOCIETY LIMITED|| FILI|C20020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_01 - AIG|| FILI|C20020_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_02 - AIG|| FILI|C20020_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_03 - AIG|| FILI|C20020_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_04 - AIG|| FILI|C20020_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_07 - AIG|| FILI|C20020_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_08 - AIG|| FILI|C20020_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_09 - AIG|| FILI|C20020_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20020_10 - AIG|| FILI|C20105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20105_01 - Canadian Northern Shield|| FILI|C20105_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20105_02 - Canadian Northern Shield|| FILI|C20105_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20105_03 - Canadian Northern Shield|| FILI|C20765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20765_01 - La Capitale - assureur de l'administration publique|| FILI|C20765_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20765_02 - La Capitale - assureur de l'administration publique|| FILI|C20765_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20765_03 - La Capitale - assureur de l'administration publique|| FILI|C20765_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20765_04 - La Capitale|| FILI|C20774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20774_01 - Generali France Assurances|| FILI|C20774_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20774_02 - Generali France Assurances|| FILI|C20823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20823_01 - Legal and General Assurance|| FILI|C20872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20872_01 - Prudential|| FILI|C20908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20908_01 - Colorado Bankers Life Insurance|| FILI|C20908_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20908_02 - Colorado Bankers Life Insurance|| FILI|C21044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21044_01 - Great-West Life Assurance Company|| FILI|C21044_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21044_02 - Great-West Life Assurance Company|| FILI|C21145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21145_01 - RGA Compagnie de reassurance-vie du Canada|| FILI|C21145_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21145_02 - RGA Reinsurance|| FILI|C21149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21149_01 - Wyde|| FILI|C21149_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21149_02 - Wyde|| FILI|C21155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21155_01 - Capita Life and Pensions Regulated Services|| FILI|C21161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21161_01 - Westcorp Financial Services|| FILI|C21161_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21161_02 - Westcorp Financial Services|| FILI|C21782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21782_01 - Northwestern Mutual Life Insurance|| FILI|C21793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21793_01 - TIAA-CREF|| FILI|C21826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21826_01 - Canadian Life and Health Insurance Association|| FILI|C21845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21845_01 - BlackboxIT Inc.|| FILI|C21845_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21845_02 - BlackboxIT Inc.|| FILI|C20509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20509_01 - Scottish Reinsurance|| FILI|C20509_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20509_03 - Scottish and York Insurance|| FILI|C20528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20528_01 - SSQ|| FILI|C20528_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20528_02 - SSQ|| FILI|C20528_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20528_03 - SSQ Générale|| FILI|C20538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20538_01 - SunLife Financial|| FILI|C20538_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20538_02 - SunLife Financial|| FILI|C20538_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20538_03 - SunLife Financial|| FILI|C20634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20634_01 - Vertex (Sun Life of Canada)|| FILI|C22252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22252_01 - EL PACIFICO VIDA|| FILI|C22301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22301_01 - Cigna Life Insurance New Zealand Limited|| FILI|C22302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22302_01 - AP Pension Livsforsikringsaktieselskab|| FILI|C22316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22316_01 - Euro-Center Holding A/S|| FILI|C22318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22318_01 - Forca A/S|| FILI|C29999_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C29999_04 - Other Sub Sector FILI|| FILI|C21877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21877_01 - Swiss Life AG|| FILI|C21889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21889_01 - GIE AG2R|| FILI|C21889_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21889_07 - GIE AG2R|| FILI|C21889_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21889_08 - GIE AG2R|| FILI|C21915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21915_01 - Princeton Holdings Limited|| FILI|C21935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21935_01 - Alecta|| FILI|C21939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21939_01 - AMF Pension|| FILI|C21970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21970_01 - Bliwa|| FILI|C22030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22030_01 - Fennia Group|| FILI|C22041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_01 - GAN/GROUPAMA|| FILI|C22041_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_02 - GAN/GROUPAMA|| FILI|C22041_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_03 - GAN/GROUPAMA|| FILI|C22041_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_04 - GAN/GROUPAMA|| FILI|C22041_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_05 - GAN/GROUPAMA|| FILI|C22041_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_06 - GAN/GROUPAMA|| FILI|C22041_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_11 - GAN/GROUPAMA|| FILI|C22041_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22041_12 - GAN/GROUPAMA|| FILI|C22046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_01 - GROUPE AXA|| FILI|C22046_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_02 - GROUPE AXA|| FILI|C22046_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_03 - GROUPE AXA|| FILI|C22046_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_04 - GROUPE AXA|| FILI|C22046_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_05 - GROUPE AXA|| FILI|C22046_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_06 - GROUPE AXA|| FILI|C22046_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_07 - GROUPE AXA|| FILI|C22046_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_09 - GROUPE AXA|| FILI|C22046_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_11 - GROUPE AXA|| FILI|C22046_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_12 - GROUPE AXA|| FILI|C22169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22169_01 - Storebrand|| FILI|C22197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22197_01 - AEGON UK|| FILI|C22199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22199_01 - AIG|| FILI|C22199_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22199_02 - AIG|| FILI|C22199_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22199_03 - AIG|| FILI|C22199_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22199_04 - AIG|| FILI|C22199_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22199_05 - AIG|| FILI|C22199_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22199_06 - AIG|| FILI|C31685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C31685_01 - Mutualidad del Ejercito y Aviación|| FILI|C80904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80904_01 - AEGON UK|| FILI|C80938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80938_01 - Equitable Life Assurance Society|| FILI|C80969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80969_01 - Prudential Services Limited|| FILI|C80284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80284_01 - AXA ZYCIE TOWARZYSTWO UBEZPIECZEN S A|| FILI|C80304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80304_01 - SEGUROS OCASO, S.A.|| FILI|C80306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80306_01 - SEGURCAIXA ADESLAS, S.A.|| FILI|C80493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80493_01 - AIG_Europe|| FILI|C80530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80530_01 - Equitable_Life|| FILI|C80645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80645_01 - Cardif|| FILI|C80704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80704_01 - Cardif|| FILI|C80715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80715_01 - Vakuutusosakeyhtio Henki-Fennia|| FILI|C81178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81178_01 - ING Nationale Nederlanden|| FILI|C81226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81226_01 - Financiere Standard Life Inc|| FILI|C81452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81452_01 - Desjardins Financial Security|| FILI|C22333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22333_01 - Sampension Administrationsselskab A/S|| FILI|C10761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C10761_01 - Pro BTP|| FILI|C22245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22245_01 - Consolidar Aseguradora de Riesgos|| FILI|C22246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22246_01 - Consolidar Compañía de Seguros de Vida|| FILI|C40326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C40326_01 - Colmena Golden Cross|| FILI|C40357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C40357_01 - Alecta|| FILI|C40358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C40358_01 - AMF Pension|| FILI|C40359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C40359_01 - Bliwa|| FILI|C40371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C40371_01 - Storebrand|| FILI|C52145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C52145_01 - Kristelig Fagbevægelse|| FILI|C80381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80381_01 - Montepio Geral Associação Mutualista|| FILI|C20054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20054_01 - Guardian Life Insurance|| FILI|C20056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20056_01 - Association d'Hospitalisation Canassuran|| FILI|C20103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20103_01 - Canada Life Insurance Company|| FILI|C20103_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20103_02 - Canada Life|| FILI|C20133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20133_01 - Imperial Life Financial|| FILI|C21008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21008_01 - Amerigroup Corp.|| FILI|C21029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21029_01 - Clarica Life Insurance Corporation|| FILI|C21036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21036_01 - Prevoyance RE|| FILI|C21147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21147_01 - Hannover Life Reinsurance Company|| FILI|C21884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21884_01 - The Equitable Life Insurance|| FILI|C21884_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21884_02 - Equitable Life of Canada|| FILI|C21905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21905_01 - FBL Financial Group|| FILI|C22036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22036_01 - Forenade Liv|| FILI|C80744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80744_01 - RGA Life Reinsurance Company of Canada|| FILI|C80902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80902_01 - Acromas Insurance Company|| FILI|C80925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80925_01 - Cardif Pinnacle Insurance|| FILI|C80994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C80994_01 - THE ROYAL LONDON MUTUAL INSURANCE SOCIET|| FILI|C20661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20661_01 - Code US - Insurance|| FILI|C20661_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20661_02 - Code US - Federal|| FILI|C20755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20755_01 - Groupama|| FILI|C20174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20174_01 - TSO3|| FILI|C20339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20339_01 - Kanawha Insurance Companies|| FILI|C20339_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20339_02 - Kanawha Insurance Companies|| FILI|C20374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20374_01 - McCamish systems, L.L.C.|| FILI|C20374_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20374_02 - McCamish systems, L.L.C.|| FILI|C20386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20386_01 - Metlife Insurance|| FILI|C20433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20433_01 - Optimum Re Corporation|| FILI|C20433_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20433_02 - Optimum Re Corporation|| FILI|C20530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20530_01 - Standard Life Assurance Company|| FILI|C21782_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C21782_02 - Northwestern Mutual Life Insurance|| FILI|C20368_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20368_07 - Manulife Financial Corporation|| FILI|C81805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81805_01 - APG|| FILI|C81806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81806_01 - National Nederlanden|| FILI|C81807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81807_01 - Delta Lloyd|| FILI|C81832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81832_01 - OHRA N.V.|| FILI|C81973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C81973_01 - Capita|| FILI|C82025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C82025_01 - Friends Life|| FILI|C82160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C82160_01 - OneBeacon Insurance Group|| FILI|C20668_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C20668_03 - LOMBARD INTERNATIONAL ASSURANCES SA|| FILI|C82342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C82342_01 - Fora AB|| FILI|C82805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C82805_01 - FBL Financial Group|| FILI|C82826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C82826_01 - SEB Pensionsforsikring A/S|| FILI|C82923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C82923_01 - PROTECTIVELIFE|| FILI|C83329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C83329_01 - Sp-Henkivakuutus Oy|| FILI|C83330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C83330_01 - Sp-Henkivakuutus Oy|| FILI|C83376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C83376_01 - Sun Life Assurance Company of Canada|| FILI|C22046_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C22046_13 - GROUPE AXA|| FILI|C83530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C83530_01 - Sun Life Financial|| FILI|C83654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C83654_01 - AXA Equitable Life Insurance Company|| FILI|C83661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C83661_01 - GUARDIAN LIFE INSURANCE|| FILI|C83865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C83865_01 - Employers Mutual Casualty Company|| FILI|C84043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84043_01 - PROTECTIVE LIFE|| FILI|C84247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84247_01 - ProAssurance|| FILI|C84249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84249_01 - Protective Life Insurance Company|| FILI|C84274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84274_01 - CAREFIRST BLUECROSS BLUE SHIELD|| FILI|C84276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84276_01 - KANAWHA INSURANCE COMPANIES (DMS)|| FILI|C84308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84308_01 - AmWINS|| FILI|C84310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84310_01 - Blue Cross Blue Shield of Tennessee|| FILI|C84391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84391_01 - ATP|| FILI|C84409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FILI_Att|C84409_01 - OH - Dept of Medicaid|| Insurance|FIPC|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FIPC|C20151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20151_01 - Commerce Insurance Company (PS)|| FIPC|C20151_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20151_02 - Commerce Insurance Company|| FIPC|C20156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20156_01 - Concord Group Insurance Company|| FIPC|C20161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20161_01 - Continental Casualty Company|| FIPC|C20163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20163_01 - Cooperators General|| FIPC|C20163_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20163_02 - Cooperators General|| FIPC|C20169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20169_01 - Groupe Desjardins Assurance Générale (DGAG)|| FIPC|C20169_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20169_02 - Groupe Desjardins Assurance Générale (DGAG)|| FIPC|C20169_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20169_03 - DGAG - Groupe Desjardins assurance générale|| FIPC|C20169_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20169_04 - Groupe Desjardins Assurance Generale (DGAG)|| FIPC|C20169_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20169_05 - Groupe Desjardins Assurance Générale (DGAG)|| FIPC|C20169_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20169_06 - Groupe Desjardins Assurance Générale (DGAG)|| FIPC|C20179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20179_01 - Cumis|| FIPC|C20179_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20179_02 - Cumis|| FIPC|C20179_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20179_04 - Cumis|| FIPC|C20179_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20179_05 - Cumis|| FIPC|C20196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20196_01 - Dominion of Canada General Ins|| FIPC|C20196_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20196_04 - Dominion of Canada General Ins|| FIPC|C20205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20205_01 - Economical Mutual Insurance Company|| FIPC|C20205_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20205_03 - Economical Mutual Insurance Company|| FIPC|C20205_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20205_04 - Economical Mutual Insurance Company IIS|| FIPC|C20205_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20205_05 - The Economical Insurance Company|| FIPC|C20211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20211_01 - Electric Insurance (DMS)|| FIPC|C20212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20212_01 - Encompass Bureau|| FIPC|C20213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20213_01 - Encompass Insurance (PS)|| FIPC|C20213_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20213_02 - Encompass Insurance|| FIPC|C20218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20218_01 - Erie Insurance Group|| FIPC|C20223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20223_01 - Family Insurance|| FIPC|C20227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20227_01 - Farmers Group Inc. 1|| FIPC|C20227_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20227_03 - Farmers Group Inc.|| FIPC|C20227_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20227_04 - Farmers Group Inc. (RB ILC/ALC) 2|| FIPC|C20227_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20227_05 - Farmers Group Inc.|| FIPC|C20227_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20227_06 - Farmers Insurance|| FIPC|C20227_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20227_07 - Farmers Insurance|| FIPC|C20230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20230_01 - Federated Mutual Insurance Company|| FIPC|C20230_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20230_02 - Federated Mutual Insurance Company|| FIPC|C20238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20238_01 - Financial Pacific Insurance Company|| FIPC|C20239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20239_01 - Financial Pacific Insurance Company|| FIPC|C20239_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20239_02 - Financial Pacific Insurance Company|| FIPC|C20239_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20239_03 - Financial Pacific Insurance Company|| FIPC|C20246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20246_01 - Florida Intracoastal|| FIPC|C20246_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20246_02 - Florida Intracoastal|| FIPC|C20263_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20263_02 - Geico (RB ILC / ALC) 1|| FIPC|C20263_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20263_03 - Geico (Staff Augmentation) 2|| FIPC|C20263_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20263_04 - Geico|| FIPC|C20265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20265_01 - Germania Farm Mutual Insurance Association|| FIPC|C20266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20266_01 - Germantown Mutual Bureau|| FIPC|C20270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20270_01 - GHS Property and Casualty Insurance Bureau|| FIPC|C20274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20274_01 - GMAC Insurance|| FIPC|C20280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20280_01 - Granada|| FIPC|C20280_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20280_02 - Granada|| FIPC|C20284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20284_01 - Grinnell Mutual Reinsurance Company|| FIPC|C20285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20285_01 - Groupe Promutuel F.S.M.A.G.|| FIPC|C20285_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20285_03 - Groupe Promutuel F.S.M.A.G.|| FIPC|C20285_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20285_04 - Promutuel|| FIPC|C20291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20291_01 - Hallmark General Agency|| FIPC|C20291_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20291_02 - Hallmark General Agency|| FIPC|C20291_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20291_03 - Hallmark Insurance Company|| FIPC|C20292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20292_01 - Hanover Insurance Company|| FIPC|C20294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20294_01 - Harford Mutual Insurance Company|| FIPC|C20295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20295_01 - Harleysville|| FIPC|C20296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20296_01 - Hartford Fire Mutual 1|| FIPC|C20296_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20296_03 - Hartford (DMS)|| FIPC|C20314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20314_01 - IMT Corporation Bureau|| FIPC|C20316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20316_01 - Indiana Farmers Mutual Insurance Company|| FIPC|C20319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20319_01 - ING Canada|| FIPC|C20319_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20319_03 - ING Canada|| FIPC|C20319_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20319_06 - ING Canada|| FIPC|C20319_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20319_07 - ING Canada|| FIPC|C20319_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20319_08 - ING - Minneapolis|| FIPC|C20338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20338_01 - K and K Insurance Group Inc.|| FIPC|C20344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20344_01 - Kingsway|| FIPC|C20344_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20344_02 - Kingsway (DMS)|| FIPC|C20344_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20344_04 - Kingsway|| FIPC|C20355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20355_01 - Lexington Group|| FIPC|C20357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20357_01 - Liberty Mutual Insurance|| FIPC|C20357_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20357_02 - Liberty Mutual Insurance|| FIPC|C20365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20365_01 - Groupement des Assureurs Automobile du Quebec|| FIPC|C20365_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20365_02 - Groupement des Assureurs Automobile du Québec|| FIPC|C20365_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20365_03 - Groupement des Assureurs Automobile du Québec|| FIPC|C20379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20379_01 - TD assurance Meloche Monnex|| FIPC|C20379_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20379_02 - Meloche Monnex|| FIPC|C20379_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20379_03 - Meloche Monnex|| FIPC|C20384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20384_01 - Merchants Insurance|| FIPC|C20387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20387_01 - Mid-Continent Casualty Company|| FIPC|C20390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20390_01 - Midwest Family Insurance (DMS)|| FIPC|C20397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20397_01 - Mutual Benefit Insurance (DMS)|| FIPC|C20397_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20397_02 - Mutual Benefit Insurance Company|| FIPC|C20398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20398_01 - Mutual of Enumclaw Insurance Company|| FIPC|C20399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20399_01 - Mutual of Omaha|| FIPC|C20400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20400_01 - National American Insurance Company|| FIPC|C20407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20407_01 - New Hampshire Insurance|| FIPC|C20408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20408_01 - New Jersey Cure|| FIPC|C20410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20410_01 - Newbury Corporation|| FIPC|C20412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20412_01 - Norfolk and Dedham Mutual|| FIPC|C20414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20414_01 - North Carolina Joint UW Bureau|| FIPC|C11108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C11108_01 - Beazley Furlonge Ltd|| FIPC|C11114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C11114_01 - CMG|| FIPC|C11153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C11153_01 - ROYAL & SUN ALLIANCE PLC Group|| FIPC|C20010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20010_01 - ACE|| FIPC|C20022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20022_01 - AIOI Insurance Company Ltd.|| FIPC|C20022_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20022_02 - AIOI Insurance Company Ltd.|| FIPC|C20023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20023_01 - Alberta Motor Association|| FIPC|C20023_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20023_02 - Alberta Motor Association|| FIPC|C20026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20026_01 - AllState|| FIPC|C20026_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20026_02 - AllState|| FIPC|C20026_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20026_03 - AllState|| FIPC|C20026_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20026_04 - Allstate Insurance Company|| FIPC|C20036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20036_01 - American Family Insurance|| FIPC|C20043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20043_01 - American Service Insurance Company - Bureau|| FIPC|C20044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20044_01 - Amerisure Companies|| FIPC|C20045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20045_01 - Amica Mutual Insurance|| FIPC|C20045_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20045_02 - Amica Mutual Insurance|| FIPC|C20045_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20045_03 - Amica Insurance|| FIPC|C20051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20051_01 - Arbella 1|| FIPC|C20051_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20051_02 - Arbella 2|| FIPC|C20051_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20051_03 - Arbella Mutual Insurance Company|| FIPC|C20051_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20051_04 - Arbella Mutual Insurance Company|| FIPC|C20058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20058_01 - Auto One Insurance (DMS)|| FIPC|C20059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20059_01 - Auto One Insurance Company (GER)|| FIPC|C20062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20062_01 - Aviva Canada Inc.|| FIPC|C20062_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20062_04 - Aviva Canada Inc.|| FIPC|C20062_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20062_05 - Aviva Canada Inc.|| FIPC|C20062_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20062_06 - Aviva Canada Inc.|| FIPC|C20063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_01 - AXA|| FIPC|C20063_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_02 - AXA|| FIPC|C20063_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_04 - AXA|| FIPC|C20063_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_05 - AXA|| FIPC|C20063_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_06 - AXA|| FIPC|C20063_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_07 - AXA|| FIPC|C20063_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_09 - AXA IM|| FIPC|C20063_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_10 - AXA Assurances|| FIPC|C20063_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_11 - AXA|| FIPC|C20063_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20063_12 - AXA Insurance|| FIPC|C20081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20081_01 - Insurance Data Processing|| FIPC|C20111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20111_01 - Capitol Indemnity Insurance|| FIPC|C20118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20118_01 - Catlin Inc.|| FIPC|C20118_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20118_02 - Catlin|| FIPC|C20134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20134_01 - Chubb|| FIPC|C20134_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20134_03 - Chubb|| FIPC|C20134_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20134_04 - Chubb|| FIPC|C20134_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20134_05 - Chubb|| FIPC|C20134_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20134_06 - Chubb|| FIPC|C20145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20145_01 - CNA Insurance Company|| FIPC|C20145_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20145_02 - CNA Insurance Company|| FIPC|C20145_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20145_03 - CNA Insurance Company|| FIPC|C20145_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20145_04 - CNA Insurance Company|| FIPC|C21832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21832_01 - Tower Insurance Group (PS)|| FIPC|C21832_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21832_02 - Tower Insurance Group|| FIPC|C21837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21837_01 - Markel Insurance Company|| FIPC|C21839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21839_01 - Chartis|| FIPC|C21839_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21839_02 - Chartis|| FIPC|C21840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21840_01 - ProSight Specialty Insurance Holdings|| FIPC|C21840_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21840_02 - ProSight Specialty Insurance Holdings|| FIPC|C21840_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21840_03 - Prosight Specialty Insurance Holdings, Inc|| FIPC|C21854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21854_01 - Towergate Insurance|| FIPC|C20420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20420_01 - Northland Insurance Company|| FIPC|C20420_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20420_02 - Northland Insurance Company|| FIPC|C20426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20426_01 - One Beacon Insurance Company|| FIPC|C20426_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20426_02 - One Beacon Insurance (DMS)|| FIPC|C20432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20432_01 - Optimum Informatique Inc.|| FIPC|C20438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20438_01 - Palisaded Safety Insurance Group|| FIPC|C20448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20448_01 - Pekin Insurance Company|| FIPC|C20450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20450_01 - Pennsylvania Lumbermens Mutual|| FIPC|C20454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20454_01 - Phenix Mutual Fire Insurance|| FIPC|C20461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20461_01 - Plymouth Rock Assurance Corporation|| FIPC|C20463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20463_01 - Portage la Prairie Mutual|| FIPC|C20466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20466_01 - Preferred Mutual Insurance Company (PS)|| FIPC|C20467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20467_01 - Premier Insurance (DMS)|| FIPC|C20472_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20472_02 - Progressive Insurance (PS)|| FIPC|C20472_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20472_03 - The Progressive Corporation|| FIPC|C20475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20475_01 - Promutuel (4609-1)|| FIPC|C20475_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20475_02 - Promutuel|| FIPC|C20476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20476_01 - Providence Washington Group Bureau|| FIPC|C20477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20477_01 - QBE Regional Companies|| FIPC|C20478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20478_01 - QBE Reinsurance Corporation|| FIPC|C20479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20479_01 - Quincy Mutual Insurance Co.|| FIPC|C20489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20489_01 - Northeast Alliance Insurance LLC|| FIPC|C20491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20491_01 - Rockford Mutual Insurance Bureau|| FIPC|C20491_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20491_02 - Rockford Mutual Insurance Bureau|| FIPC|C20494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20494_01 - Royal and Sun Alliance|| FIPC|C20494_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20494_02 - Royal and Sun Alliance|| FIPC|C20494_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20494_04 - Royal and Alliance|| FIPC|C20494_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20494_05 - Royal and Alliance|| FIPC|C20494_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20494_07 - Royal and Alliance|| FIPC|C20494_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20494_08 - Royal Sun and Alliance IIS|| FIPC|C20494_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20494_09 - Royal Sun and Alliance|| FIPC|C20500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20500_01 - Safety Insurance|| FIPC|C20500_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20500_02 - Safety Insurance|| FIPC|C20503_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20503_01 - Saskatchewan Government Insurance|| FIPC|C20511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20511_01 - Selective Insurance Co. Of America|| FIPC|C20512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20512_01 - Selective Insurance Company|| FIPC|C20516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20516_01 - Shared Technology Services|| FIPC|C20534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20534_01 - State National (DMS)|| FIPC|C20534_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20534_02 - State National Companies|| FIPC|C20534_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20534_03 - State National Companies|| FIPC|C20541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20541_01 - Surplex Underwriters Inc.|| FIPC|C20553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20553_01 - Texas Fair Plan|| FIPC|C20554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20554_01 - Texas Farm Bureau|| FIPC|C20556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20556_01 - The Hartford|| FIPC|C20559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20559_01 - The Premier Insurance Company|| FIPC|C20567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20567_01 - Tokio Marine|| FIPC|C20567_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20567_02 - Tokio Marine|| FIPC|C20575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20575_01 - Travelers Indemnity Company|| FIPC|C20575_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20575_02 - The Travelers Indemnity Company|| FIPC|C20577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20577_01 - Travelers Insurance|| FIPC|C20577_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20577_02 - Travelers Insurance|| FIPC|C20588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20588_01 - United Fire Group|| FIPC|C20590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20590_01 - Unitrin Property and Casualty Bureau|| FIPC|C20590_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20590_02 - Unitrin (FIC)|| FIPC|C20592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20592_01 - Universal Claims|| FIPC|C20594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20594_01 - Universal Insurance Service|| FIPC|C20596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20596_01 - Universal Insurance (DMS)|| FIPC|C20601_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20601_02 - USAA|| FIPC|C20601_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20601_03 - USAA|| FIPC|C20601_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20601_04 - USAA|| FIPC|C20602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20602_01 - USF Insurance Company IT Licensing|| FIPC|C20603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20603_01 - Utica Mutual Insurance Co.|| FIPC|C20608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20608_01 - Virginia Property Insurance Association|| FIPC|C20617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20617_01 - Wisconsin American Mutual Insurance Bureau|| FIPC|C20624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20624_01 - Zurich American Insurance|| FIPC|C20624_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20624_02 - Zurich American Insurance|| FIPC|C20624_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20624_03 - ZURICH Holding / UUG|| FIPC|C20624_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20624_04 - Zurich American Insurance|| FIPC|C20633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20633_01 - Equity|| FIPC|C20633_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20633_02 - Equity Insurance Group Limited|| FIPC|C20633_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20633_03 - Equity Insurance Group Limited|| FIPC|C20633_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20633_04 - Equity Insurance Group Limited|| FIPC|C20637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20637_01 - Allianz|| FIPC|C20637_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20637_02 - Allianz|| FIPC|C20637_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20637_03 - Allianz|| FIPC|C20637_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20637_04 - Allianz|| FIPC|C20657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20657_01 - RSA|| FIPC|C20657_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20657_02 - RSA|| FIPC|C20657_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20657_04 - RSA Insurance Group plc|| FIPC|C20659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20659_01 - DGAG|| FIPC|C20659_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20659_02 - DGAG|| FIPC|C20664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20664_01 - Echelon General Insurance|| FIPC|C20689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20689_01 - HB Group Insurance Management|| FIPC|C20689_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20689_02 - HB Group Insurance Management|| FIPC|C20693_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20693_01 - L'Union Canadienne|| FIPC|C20693_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20693_02 - L'Union Canadienne|| FIPC|C20693_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20693_03 - L'Union Canadienne|| FIPC|C20701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20701_01 - Wawanesa Insurance|| FIPC|C22291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22291_01 - Atradius Credit Insurance N.V.|| FIPC|C22292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22292_01 - Canal Insurance Company|| FIPC|C22317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22317_01 - Euro-Center Holding North Asia (HK) Pte Limited|| FIPC|C22319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22319_01 - Forenede Gruppeliv|| FIPC|C22337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22337_01 - Tryg Garantiforsikring A/S|| FIPC|C22356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22356_01 - Gjensidige NOB Bank|| FIPC|C29999_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C29999_05 - Other Sub Sector FIPC|| FIPC|C21864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21864_01 - AMLIN Group|| FIPC|C21869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21869_01 - Talanx|| FIPC|C21882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21882_01 - PowerPlace Insurance Limited|| FIPC|C21890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21890_01 - First Assist|| FIPC|C21893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21893_01 - Hastings Direct|| FIPC|C21896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21896_01 - Jewelers Mutual|| FIPC|C21933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21933_01 - Northbridge Financial Corporation|| FIPC|C21936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21936_01 - ALLIANZ|| FIPC|C21936_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21936_02 - ALLIANZ|| FIPC|C21936_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21936_03 - ALLIANZ|| FIPC|C21936_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21936_04 - ALLIANZ|| FIPC|C21936_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21936_05 - ALLIANZ|| FIPC|C21936_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21936_06 - ALLIANZ|| FIPC|C21937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21937_01 - Allianz AG|| FIPC|C21947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21947_01 - AXA|| FIPC|C21998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21998_01 - Collectum|| FIPC|C22000_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_02 - COVEA|| FIPC|C22000_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_03 - COVEA|| FIPC|C22000_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_04 - COVEA|| FIPC|C22000_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_05 - COVEA|| FIPC|C22000_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_06 - COVEA|| FIPC|C22000_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_12 - COVEA|| FIPC|C22006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22006_01 - DAK Deutsche Angestellten-Krankenkasse|| FIPC|C22021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22021_01 - Ergo|| FIPC|C22035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22035_01 - Folksam|| FIPC|C22044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22044_01 - Gothaer|| FIPC|C22047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22047_01 - GROUPE GENERALI|| FIPC|C22047_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22047_02 - GROUPE GENERALI|| FIPC|C22047_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22047_03 - GROUPE GENERALI|| FIPC|C22047_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22047_04 - GROUPE GENERALI|| FIPC|C22047_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22047_05 - GROUPE GENERALI|| FIPC|C22047_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22047_06 - GROUPE GENERALI|| FIPC|C22050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22050_01 - Hannover|| FIPC|C22057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22057_01 - IF|| FIPC|C22071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22071_01 - Keskinainen Vakuutusyhtio Tapiola|| FIPC|C22072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22072_01 - Keva|| FIPC|C22077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22077_01 - Lærerstandens Brandforsikring|| FIPC|C22078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22078_01 - Lahivakuutus Keskinainen Yhtio|| FIPC|C22089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22089_01 - Moderna Forsakringar|| FIPC|C22091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22091_01 - Munchner Ruckversicherungs AG|| FIPC|C22124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_01 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_02 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_03 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_04 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_05 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_06 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_07 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_08 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_09 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_11 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22124_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22124_12 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C22125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22125_01 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| FIPC|C22125_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22125_02 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| FIPC|C22125_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22125_04 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| FIPC|C22125_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22125_05 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| FIPC|C22125_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22125_06 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| FIPC|C22128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22128_01 - P&V Insurances|| FIPC|C22133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22133_01 - PRI Pensionsgaranti|| FIPC|C22151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22151_01 - Sampo Oyj|| FIPC|C22161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22161_01 - Skandia|| FIPC|C22179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22179_01 - Tryg Forsikring|| FIPC|C22180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22180_01 - Trygg-Hansa|| FIPC|C22198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22198_01 - AFA|| FIPC|C51199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C51199_01 - Chubb Fire Ltd|| FIPC|C60236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C60236_01 - CRÉDITO Y CAUCIÓN, S.A.|| FIPC|C80197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80197_01 - VAB|| FIPC|C80207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80207_01 - DOMESTIC AND GENERAL INSURANCE PLC|| FIPC|C80218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80218_01 - Reinsurance Group of America, Incorporated|| FIPC|C80834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80834_01 - Aviva Insurance Services|| FIPC|C80918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80918_01 - BEAZLEY FURLONGE|| FIPC|C80922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80922_01 - Canopius|| FIPC|C80959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80959_01 - Motor Insurers' Bureau|| FIPC|C80971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80971_01 - QBE|| FIPC|C80273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80273_01 - Texas Fair Plan|| FIPC|C80386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80386_01 - Paymaster (1836) Ltd|| FIPC|C80415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80415_01 - Linea Directa Aseguradora S.A.|| FIPC|C80454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80454_01 - Federal Deposit Insurance Corporation (FDIC)|| FIPC|C80470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80470_01 - North Carolina JUA|| FIPC|C80557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80557_01 - Liverpool_Victoria|| FIPC|C80614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80614_01 - Beazley_Furlonge|| FIPC|C80660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80660_01 - C. V. Starr & Co.|| FIPC|C80660_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80660_02 - Starr Insurance|| FIPC|C80662_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80662_01 - Mendota Insurance|| FIPC|C80697_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80697_01 - American Commerce Insurance Company|| FIPC|C80714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80714_01 - Keskinainen Vakuutusyhtio Fennia|| FIPC|C80716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80716_01 - Keskinainen Vakuutusyhtio Fennia|| FIPC|C80741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80741_01 - RACE Real Automovil Club de Espana|| FIPC|C80752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80752_01 - OJSC IC Allianz|| FIPC|C80776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80776_01 - Ace Insurance Company|| FIPC|C80809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80809_01 - ZURICH ASSURANCES MAROC|| FIPC|C81181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81181_01 - Ohio Bureau of Workers- Compensation|| FIPC|C81190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81190_01 - The Co-operaters|| FIPC|C81209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81209_01 - Kanetix Ltd|| FIPC|C81277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81277_01 - AlfaMutual|| FIPC|C81285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81285_01 - AIGHawaii|| FIPC|C81315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81315_01 - REPARALIAS.A.|| FIPC|C81440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81440_01 - i2iQ Inc.|| FIPC|C81441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81441_01 - Oceanwide Speciality Insurance|| FIPC|C81460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81460_01 - Foremost Insurance Company|| FIPC|C10088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C10088_01 - Canada Direct Insurance|| FIPC|C10088_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C10088_02 - Canada Direct Insurance|| FIPC|C20147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20147_01 - Columbia Insurance Group Bureau|| FIPC|C20712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20712_01 - Reunica|| FIPC|C20712_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20712_07 - Reunica|| FIPC|C20712_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20712_08 - Reunica|| FIPC|C20719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20719_01 - Confused.Com|| FIPC|C20722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20722_01 - Markerstudy Insurance Co. Ltd|| FIPC|C20730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20730_01 - Insurance RH|| FIPC|C20734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20734_01 - Macif|| FIPC|C20734_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20734_02 - Macif|| FIPC|C20734_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20734_03 - Macif|| FIPC|C20734_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20734_07 - Macif|| FIPC|C20734_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20734_08 - Macif|| FIPC|C20740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20740_01 - York Fire and Casualty|| FIPC|C20815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20815_01 - Eagle Star Insurance Co.|| FIPC|C20816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20816_01 - Eclipse at Lloyd's|| FIPC|C20817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20817_01 - EUI Limited|| FIPC|C20818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20818_01 - GHL Insurance Services UK Limited|| FIPC|C20819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20819_01 - Hastings Insurance Services Ltd|| FIPC|C20819_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20819_02 - Hastings Insurance Services Ltd|| FIPC|C20820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20820_01 - Hibernian Group PLC|| FIPC|C20821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20821_01 - Jubilee Motor Policies|| FIPC|C20821_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20821_02 - Jubilee Motor Policies|| FIPC|C20825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20825_01 - Norwich Union Insurance|| FIPC|C20827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20827_01 - RBS Insurance PLC|| FIPC|C20827_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20827_02 - RBS Insurance PLC|| FIPC|C20828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20828_01 - Sabre Insurance Company Ltd|| FIPC|C20829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20829_01 - Service Underwriting Agency|| FIPC|C20829_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20829_02 - Service Underwriting Agency|| FIPC|C20833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20833_01 - Hiscox|| FIPC|C20833_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20833_02 - Hiscox|| FIPC|C20833_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20833_03 - Hiscox Insurance Company Inc|| FIPC|C20834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20834_01 - ING Insurance (Uslugi Finansowe S.A)|| FIPC|C20851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20851_01 - Sovereign General Insurance|| FIPC|C20855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20855_01 - Scor|| FIPC|C20855_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20855_02 - Scor|| FIPC|C20856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20856_01 - Universal Underwriters Group|| FIPC|C20856_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20856_02 - Universal Underwriters Group|| FIPC|C20860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20860_01 - Country Companies|| FIPC|C20862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20862_01 - Knightbrook Insurance Company|| FIPC|C20864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20864_01 - SCM Claimspro - Indemnipro|| FIPC|C20884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20884_01 - TD Bank IIS|| FIPC|C20885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20885_01 - Desjardins IIS|| FIPC|C20886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20886_01 - HWGC IIS|| FIPC|C20888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20888_01 - Gjensidige Forsikring|| FIPC|C20888_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20888_02 - Gjensidige Forsikring|| FIPC|C20893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20893_01 - CAA - Canadian Automobile Association|| FIPC|C20893_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20893_02 - CAA Quebec|| FIPC|C20897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20897_01 - Total Dollar Insurance|| FIPC|C20899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20899_01 - Intact Corporation Financiere|| FIPC|C20899_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20899_02 - Intact Assurance|| FIPC|C20899_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20899_03 - Intact Financial Corporation|| FIPC|C20899_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20899_04 - Intact Insurance Company|| FIPC|C20899_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20899_05 - Intact Insurance Company|| FIPC|C20907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20907_01 - Agsecurity|| FIPC|C21018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21018_01 - Insurance Corporation of British Columbia (ICBC)|| FIPC|C21024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21024_01 - Premierline Direct|| FIPC|C21028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21028_01 - Insurance Bureau of Canada|| FIPC|C21043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21043_01 - Facility Association|| FIPC|C21050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21050_01 - Liberty Mutual Insurance|| FIPC|C21132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21132_01 - Gore Mutual Insurance Company|| FIPC|C21136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21136_01 - Jevco Insurance Company|| FIPC|C21137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21137_01 - Saskatchewan Crop Insurance Corporation|| FIPC|C21141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21141_01 - AAA Mid-Atlantic|| FIPC|C21142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21142_01 - Great American Insurance Companies|| FIPC|C21143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21143_01 - Cameron Insurance Company|| FIPC|C21143_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21143_02 - Cameron Insurance Company|| FIPC|C21150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21150_01 - Caser|| FIPC|C21151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21151_01 - Liverpool Victoria Friendly Society|| FIPC|C21152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21152_01 - Main Street America Assurance Company|| FIPC|C21152_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21152_02 - Main Street America Assurance Company|| FIPC|C21154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21154_01 - Fireman's Fund Insurance Co.|| FIPC|C21154_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21154_02 - Fireman's Fund Insurance Co.|| FIPC|C21154_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21154_03 - Fireman's Fund Insurance Co.|| FIPC|C21166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21166_01 - New Jersey Skylands|| FIPC|C21167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21167_01 - Union Canadienne Compagnie d'Assurances|| FIPC|C21169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21169_01 - Home and Legacy|| FIPC|C21170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21170_01 - St. Paul Travelers|| FIPC|C21175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21175_01 - Citizens United Reciprocal Exchange|| FIPC|C21177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21177_01 - Aviva Plc|| FIPC|C21780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21780_01 - Personal Insurance Company of Canada|| FIPC|C21780_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21780_02 - Personal Insurance Company of Canada|| FIPC|C21783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21783_01 - Mapfre USA|| FIPC|C21783_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21783_02 - Mapfre USA|| FIPC|C21790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21790_01 - Trident Insurance Services of New England Inc.|| FIPC|C21790_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21790_02 - Trident Insurance Services of New England Inc.|| FIPC|C21795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21795_01 - Liberty Syndicate Management Ltd|| FIPC|C21797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21797_01 - Johnson Inc.|| FIPC|C21803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21803_01 - Philadelphia Insurance Company|| FIPC|C21816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21816_01 - PZU Group|| FIPC|C21821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21821_01 - HDI Versicherungen|| FIPC|C21824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21824_01 - United Educators|| FIPC|C21829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21829_01 - Credito y Caucion|| FIPC|C21831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21831_01 - Domestic and General Insurance|| FIPC|C81468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81468_01 - Arbella Protection INS Bureau|| FIPC|C81469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81469_01 - Columbia Insurance Group|| FIPC|C81470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81470_01 - Germantown Mutual Bureau|| FIPC|C81471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81471_01 - IMT Corporation Bureau|| FIPC|C81472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81472_01 - Knightbrook Insurance|| FIPC|C81473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81473_01 - Mutual of Enumclaw|| FIPC|C81492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81492_01 - Elephant Insurance Company|| FIPC|C81502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81502_01 - Kingstone Companies, Inc.|| FIPC|C81506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81506_01 - Groupe Promutuel Féd de Société Mutuelles Assur Ge|| FIPC|C81507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81507_01 - UNICA Insurance Inc.|| FIPC|C20161_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20161_02 - Continental Casualty Company|| FIPC|C81492_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81492_02 - Elephant Insurance Company|| FIPC|C40356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40356_01 - AFA|| FIPC|C40360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40360_01 - Collectum|| FIPC|C40361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40361_01 - Folksam|| FIPC|C40362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40362_01 - Hannover|| FIPC|C40363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40363_01 - IF|| FIPC|C40367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40367_01 - Moderna Forsakringar|| FIPC|C40368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40368_01 - PRI Pensionsgaranti|| FIPC|C40370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40370_01 - Skandia|| FIPC|C40374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C40374_01 - Trygg-Hansa|| FIPC|C80211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80211_01 - Norfolk Mutual Insurance Company|| FIPC|C80219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80219_01 - American General Finance, Inc (LA)|| FIPC|C80676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80676_01 - Assurant, Inc.|| FIPC|C80678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80678_01 - OneBeacon Insurance|| FIPC|C81535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81535_01 - TD Insurance Meloche Monnex|| FIPC|C20003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20003_01 - A Central Mutual Insurance|| FIPC|C20027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20027_01 - Alpha - Compagnie d'assurance|| FIPC|C20030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20030_01 - Amcom Insurance Services Inc.|| FIPC|C20032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20032_01 - American International Group|| FIPC|C20033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20033_01 - American Claims Management - SIU|| FIPC|C20040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20040_01 - American Home Assurance Company|| FIPC|C20041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20041_01 - American Insurance|| FIPC|C20042_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20042_02 - American Physicians Assurance|| FIPC|C20079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20079_01 - Bay Area Insurance Services|| FIPC|C20112_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20112_02 - Capitol Insurance|| FIPC|C20143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20143_01 - Clarendon|| FIPC|C20895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20895_01 - Motors Insurance Corporation|| FIPC|C20897_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20897_02 - Total Dollar Insurance|| FIPC|C20904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20904_01 - Coachman Insurance Company|| FIPC|C20905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20905_01 - The Guarantee Company of North America|| FIPC|C21016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21016_01 - Optimum Insurance Company Inc|| FIPC|C21020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21020_01 - K and K Insurance Group Inc.|| FIPC|C21026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21026_01 - US Security Ins Co|| FIPC|C21038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21038_01 - ACE Ina Insurance|| FIPC|C21109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21109_01 - Utica Mutual Inc. Co (MA)|| FIPC|C21128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21128_01 - MIF Assurances|| FIPC|C21779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21779_01 - Roins Financial Services Limited|| FIPC|C21784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21784_01 - State Automobile Mutual Insurance Company|| FIPC|C21798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21798_01 - 21st Century Insurance Group|| FIPC|C21798_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21798_02 - 21st Century Insurance Group|| FIPC|C21800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21800_01 - Fidelity and Deposit Company of Maryland|| FIPC|C21800_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21800_02 - Fidelity and Deposit Company of Maryland|| FIPC|C21801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21801_01 - HCC Public Risk (Eastern Division)|| FIPC|C21802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21802_01 - Liberty International Underwriters|| FIPC|C21827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21827_01 - North Waterloo Farmers Mutual Insurance Company|| FIPC|C21850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21850_01 - American Country|| FIPC|C21850_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21850_02 - American Country|| FIPC|C21851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21851_01 - La Personnelle Inc.|| FIPC|C21858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21858_01 - Square One Insurance Services Inc.|| FIPC|C21859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21859_01 - American Security Insurance Company|| FIPC|C21860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21860_01 - Tri-State Consumer Insurance Company|| FIPC|C21871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21871_01 - Code Toronto - P/C Insurance|| FIPC|C21918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C21918_01 - Jewelers Mutual|| FIPC|C80849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80849_01 - Premierline Direct|| FIPC|C80919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80919_01 - BGL Group Limited|| FIPC|C80941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80941_01 - FBD Insurance|| FIPC|C80987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80987_01 - Swinton Group Limited|| FIPC|C81210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81210_01 - CAA - Central Ontario|| FIPC|C81328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81328_01 - Pemco Insurance|| FIPC|C81348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81348_01 - HWGC - Co-operators General Insurance Company|| FIPC|C81391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81391_01 - American Safety Insurance Group|| FIPC|C81392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81392_01 - Erie Insurance|| FIPC|C81393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81393_01 - Hartford Fire Insurance Co|| FIPC|C20612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20612_01 - West Bend Mutual Insurance Company|| FIPC|C20620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20620_01 - XL Global Services Inc.|| FIPC|C20626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20626_01 - Zurich Insurance Co.|| FIPC|C20626_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20626_03 - Zurich Insurance Co.|| FIPC|C20626_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20626_04 - Zurich|| FIPC|C20658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20658_01 - AIU Insurance|| FIPC|C20663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20663_01 - Statefarm|| FIPC|C20665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20665_01 - Elliot and Page / Manulife|| FIPC|C20682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20682_01 - Belliveau Insurance Inc.|| FIPC|C20683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20683_01 - CAA Insurance Inc.|| FIPC|C20685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20685_01 - Certas Direct|| FIPC|C20685_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20685_02 - Certas Direct Insurance|| FIPC|C20685_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20685_03 - Certas Direct Insurance|| FIPC|C20690_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20690_01 - John Hancock - Manufacturers Life Insurance Compagny|| FIPC|C20691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20691_01 - LienQuest|| FIPC|C20694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20694_01 - Metro General Insurance Corp.|| FIPC|C20695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20695_01 - Nordic Insurance Company of Canada|| FIPC|C20696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20696_01 - Pilot Insurance Personal Lines Eastern|| FIPC|C20698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20698_01 - The Nordic Insurance Co.|| FIPC|C20699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20699_01 - Traders General Insurance Co.|| FIPC|C20700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20700_01 - Unifund Assurance|| FIPC|C20700_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20700_02 - Unifund Assurance|| FIPC|C20704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20704_01 - Belair Direct|| FIPC|C20705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20705_01 - Adjusters|| FIPC|C20726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20726_01 - Magnolia Policy|| FIPC|C20727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20727_01 - SIC reccurring business|| FIPC|C20731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20731_01 - Magnolia Insurance Company|| FIPC|C20732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20732_01 - Legacy Insurance Company|| FIPC|C20735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20735_01 - Professional Quality Insurance LTD|| FIPC|C20737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20737_01 - Insurance UAB + Rich. Hill (96M * 80% * 5 years)|| FIPC|C20738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20738_01 - Adj CRM - RMM|| FIPC|C20739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20739_01 - Other Corporate Adjustment|| FIPC|C20743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20743_01 - AGF AM|| FIPC|C20775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20775_01 - Macif Mutualité|| FIPC|C20854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20854_01 - APCapital Inc.|| FIPC|C20859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20859_01 - Pilot Insurance Company|| FIPC|C20863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20863_01 - American Skyline Insurance Company|| FIPC|C20159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20159_01 - Constitutional Casualty Bureau|| FIPC|C20160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20160_01 - Consumer First Insurance Company, NJ|| FIPC|C20165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20165_01 - Countryway Insurance Company|| FIPC|C20166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20166_01 - Countrywide Insurance Company|| FIPC|C20168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20168_01 - CPAS Systems|| FIPC|C20184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20184_01 - Delis|| FIPC|C20189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20189_01 - Diagnostic Imaging Group|| FIPC|C20202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20202_01 - Eagle NJ Group|| FIPC|C20204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20204_01 - Eastern Insurance|| FIPC|C20220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20220_01 - Eveready Insurance Company|| FIPC|C20224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20224_01 - Farm Bureau Mutual|| FIPC|C20228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20228_01 - Farmers Home Mutual Bureau|| FIPC|C20240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20240_01 - First Canadian Title Company Ltd|| FIPC|C20242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20242_01 - First Class Group Inc.|| FIPC|C20252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20252_01 - Founders Insurance Company|| FIPC|C20264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20264_01 - Georgia Farm Bureau Insurance|| FIPC|C20288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20288_01 - Guideone Insurance Group|| FIPC|C20290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20290_01 - Haberman Insurance Group|| FIPC|C20299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20299_01 - Hermitage Insurance Company|| FIPC|C20300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20300_01 - High Point Safety and Insurance Management Corporation|| FIPC|C20301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20301_01 - Horace Mann|| FIPC|C20309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20309_01 - IFA Insurance Company|| FIPC|C20312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20312_01 - Imperial Fire and Casualty - SIU|| FIPC|C20321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20321_01 - Instruct Insurance Group - SIU|| FIPC|C20322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20322_01 - Insureco Inc.|| FIPC|C20324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20324_01 - Interboro Mutual Insurance|| FIPC|C20324_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20324_02 - Interboro|| FIPC|C20324_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20324_03 - Interboro|| FIPC|C20333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20333_01 - Island Group|| FIPC|C20356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20356_01 - Liberty Agency Markets|| FIPC|C20362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20362_01 - LWP Claims Solutions Inc.|| FIPC|C20370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20370_01 - Marine MGA Inc.|| FIPC|C20380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20380_01 - Melrose Insurance Group|| FIPC|C20383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20383_01 - Merastar Insurance Company|| FIPC|C20385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20385_01 - Merchants Mutual|| FIPC|C20389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20389_01 - Midlands SIU|| FIPC|C20402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20402_01 - National Claims|| FIPC|C20403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20403_01 - National Continental Insurance / Progressive|| FIPC|C20405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20405_01 - Nationwide Insurance|| FIPC|C20409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20409_01 - New York Central Mutual|| FIPC|C20413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20413_01 - North American Risk|| FIPC|C20418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20418_01 - Northern New England Benefit Trust|| FIPC|C20418_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20418_02 - Northern New England Benefit Trust|| FIPC|C20423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20423_01 - Nova Casualty Bureau|| FIPC|C20425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20425_01 - Oak Tree Insurance Center|| FIPC|C20441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20441_01 - Paragon Insurance Group - SIU|| FIPC|C20442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20442_01 - Parkway|| FIPC|C20443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20443_01 - Partners Mutal Insurance Company Bureau|| FIPC|C20444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20444_01 - Paymentech Canada|| FIPC|C20447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20447_01 - Peerless Insurance Company|| FIPC|C20452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20452_01 - People's Service Insurance|| FIPC|C20457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20457_01 - Pilgrim Insurance Company Bureau|| FIPC|C20458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20458_01 - Pilgrim Insurance Company|| FIPC|C20459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20459_01 - Platinum Claims Services|| FIPC|C20464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20464_01 - Praetorian|| FIPC|C20471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20471_01 - Program Brokerage Corp.|| FIPC|C20488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20488_01 - Robert A. Peloquin Insurance|| FIPC|C20492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20492_01 - Rockhill Insurance Company|| FIPC|C20493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20493_01 - Rockwood Casualty Insurance Co.|| FIPC|C20496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20496_01 - Royal Indemnity Company|| FIPC|C20499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20499_01 - Safeco Property and Casualty Insurance|| FIPC|C20502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20502_01 - Sapiens Americas Corporation|| FIPC|C20513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20513_01 - Selective Insurance Company|| FIPC|C20517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20517_01 - Shelter Insurance Companies|| FIPC|C20522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20522_01 - Southern Trust Insurance Company|| FIPC|C20532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20532_01 - State Farm Indemnity Co.|| FIPC|C20533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20533_01 - State Farm Insurance|| FIPC|C20533_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20533_02 - State Farm Fire and Casualty Company|| FIPC|C20552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20552_01 - Tennessee Farmers Insurance Company|| FIPC|C20555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20555_01 - The Camdem Fire Insurance Association|| FIPC|C20562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20562_01 - Thomas Gregory Associates|| FIPC|C20564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20564_01 - TideWater|| FIPC|C20572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20572_01 - Tower Hill Insurance Group (SIU)|| FIPC|C20573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20573_01 - Transamerica Insurance Group|| FIPC|C20574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20574_01 - Travelers Indemnity Co/Arts|| FIPC|C20576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20576_01 - Travelers Indemnity - Trns Claim|| FIPC|C20578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20578_01 - Tuscarora Wayne Mutual|| FIPC|C20579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20579_01 - Twin Lights Insurance Co.|| FIPC|C20581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20581_01 - U.S. Security Insurance Co.|| FIPC|C20582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20582_01 - UBS Travel|| FIPC|C20583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20583_01 - Ulico Casualty - SIU|| FIPC|C20589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20589_01 - United Services Auto. Association|| FIPC|C20593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20593_01 - Universal FL PA Proc.|| FIPC|C20595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20595_01 - Universal NA Florida - Implementatio|| FIPC|C80341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80341_01 - Perth Insurance Company|| FIPC|C10008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C10008_01 - BCAA - British Columbia Automobile Association|| FIPC|C10108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C10108_01 - Club automobile du Québec|| FIPC|C10893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C10893_01 - ORAG Rechtsschutz|| FIPC|C11061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C11061_01 - Cypher Systems Group Inc|| FIPC|C81415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81415_01 - Keskin�inen Vakuutusyhti� Fennia|| FIPC|C81560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81560_01 - Universal Insurance of North America|| FIPC|C81648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81648_01 - Tryg - Domicil, R25|| FIPC|C81692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81692_01 - Illinois Fair Plan|| FIPC|C81697_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81697_01 - Chubb & Son|| FIPC|C81652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81652_01 - Codan Forsikring A/S|| FIPC|C81685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81685_01 - Millers Capital Insurance Company|| FIPC|C81348_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81348_02 - HWGC - Co-operators General Insurance Company|| FIPC|C11153_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C11153_02 - Royal & Sun Alliance Insurance Company of Canada|| FIPC|C80676_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80676_02 - Assurant Group|| FIPC|C81863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81863_01 - Arch Insurance Company|| FIPC|C81864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81864_01 - Argo Group Us, Inc.|| FIPC|C22109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22109_01 - OP-Pohjola|| FIPC|C81923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81923_01 - Shelter Insurance Companies|| FIPC|C81935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81935_01 - Liberty Mutual Insurance Company|| FIPC|C81942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81942_01 - Co-Operators Group Limited, The|| FIPC|C81947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81947_01 - Brotherhood Mutual Insurance Company|| FIPC|C81959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81959_01 - Highway Insurance Company Ltd|| FIPC|C81967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C81967_01 - RBC General Insurance Company|| FIPC|C22000_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_11 - COVEA|| FIPC|C22000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C22000_01 - COVEA|| FIPC|C82036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82036_01 - Assicurazioni Generali|| FIPC|C82040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82040_01 - AAA-Florida (DMS)|| FIPC|C82117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82117_01 - Codan Forsikring A/S|| FIPC|C82118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82118_01 - Trygg Hansa F�rs�kring AB|| FIPC|C82132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82132_01 - AGSECURITY INSURANCE COMPANY|| FIPC|C82134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82134_01 - American Financial Group|| FIPC|C82140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82140_01 - Chartis Property Casualty Company|| FIPC|C82141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82141_01 - CATLIN, Inc.|| FIPC|C82146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82146_01 - CONCORD GROUP INS COMPANY|| FIPC|C82153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82153_01 - Hanover Insurance Group|| FIPC|C82156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82156_01 - National Grange Mutual Ins|| FIPC|C82162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82162_01 - PHENIX MUTUAL FIRE INS CO|| FIPC|C82164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82164_01 - QUINCY MUTUAL FIRE INS CO|| FIPC|C82166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82166_01 - Selective Insurance Co. Of America|| FIPC|C82167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82167_01 - SELECTIVE INSURANCE COMPANY|| FIPC|C82181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82181_01 - Germantown Mutual Insurance Company|| FIPC|C82183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82183_01 - Knightbrook Insurance|| FIPC|C82184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82184_01 - Millers Mutual Group|| FIPC|C82250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82250_01 - NGM Insurance Company (PS)|| FIPC|C82276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82276_01 - Lansforsakringar Fondliv Forsakrings AB|| FIPC|C82282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82282_01 - Centido AB|| FIPC|C82375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82375_01 - Western National Insurance|| FIPC|C82382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82382_01 - FIREMAN'S FUND INSURANCE COMPANY|| FIPC|C82384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82384_01 - ALLSTATE INSURANCE (PS)|| FIPC|C82377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82377_01 - Qualitas Insurance Company|| FIPC|C82381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82381_01 - BILLMATRIX/PREMIER|| FIPC|C82383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOPR_Att|C82383_01 - BILL MATRIX/ENCOMPASS|| FIPC|C80713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C80713_01 - C80713_01 - Tieto-Tapiola Oy|| FIPC|C82412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82412_01 - Qualitas Insurance Company|| FIPC|C82422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82422_01 - ARCH Insurance Group Inc|| FIPC|C82428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82428_01 - Keskin�inen El�kevakuutusyhti� Etera|| FIPC|C82429_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82429_01 - Keskin�inen Ty�el�kevakuutusyhti� Elo|| FIPC|C82448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82448_01 - James River Group, Inc.|| FIPC|C82475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82475_01 - Dina F�rs�kring AB|| FIPC|C82490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82490_01 - ASR|| FIPC|C82521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82521_01 - DEVK Deutsche Eisenbahn Versicherung|| FIPC|C82523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82523_01 - AXA Konzern AG|| FIPC|C82541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82541_01 - Innovation Group PLC|| FIPC|C82568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82568_01 - PEMCO Mutual Insurance Company|| FIPC|C82578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82578_01 - Mutual of Enumclaw|| FIPC|C82579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82579_01 - CSAA Insurance Group|| FIPC|C82580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82580_01 - Firemans Fund Insurance Company|| FIPC|C82581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82581_01 - Farmers Insurance Hawaii|| FIPC|C82582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82582_01 - Farmers Group Inc. / Zurich|| FIPC|C82600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82600_01 - Chartis Property Casualty Company|| FIPC|C82601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82601_01 - Amica Mutual Insurance Company|| FIPC|C82602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82602_01 - Farm Family Mutual Insurance|| FIPC|C82603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82603_01 - SELECTIVE INSURANCE COMPANY|| FIPC|C82606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82606_01 - QBE Regional Companies|| FIPC|C82607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82607_01 - Hanover Insurance Group|| FIPC|C82608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82608_01 - CONCORD GROUP INS COMPANY|| FIPC|C82609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82609_01 - PHENIX MUTUAL FIRE INS CO|| FIPC|C82610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82610_01 - QUINCY MUTUAL FIRE INS CO|| FIPC|C82611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82611_01 - CURE Insurance|| FIPC|C82612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82612_01 - Hiscox Insurance|| FIPC|C82616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82616_01 - TOKIO MARINE & NICHIDO FIRE INS CO|| FIPC|C82623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82623_01 - Arbella Insurance (DMS)|| FIPC|C82635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82635_01 - Chubb and Son|| FIPC|C82651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82651_01 - Hastings Mutual Insurance Company|| FIPC|C82652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82652_01 - Reinsurance Group of America Inc|| FIPC|C82653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82653_01 - AGSECURITY INSURANCE COMPANY|| FIPC|C82654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82654_01 - ARGO GROUP US (TRIDENT)|| FIPC|C82655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82655_01 - Hallmark Insurance Group|| FIPC|C82656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82656_01 - Granada Insurance Company|| FIPC|C82657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82657_01 - Germantown Mutual Insurance Company|| FIPC|C82658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82658_01 - Universal Insurance Group|| FIPC|C82660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82660_01 - ALLSTATE AL2 BUREAU|| FIPC|C82661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82661_01 - UNITRIN SPECIALITY LINES|| FIPC|C82663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82663_01 - TEXAS FAIR PLAN|| FIPC|C82664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82664_01 - Federated Mutual Insurance Co.|| FIPC|C82665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82665_01 - Mid-Continent Casualty Company|| FIPC|C82666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82666_01 - Shelter Insurance Companies|| FIPC|C82667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82667_01 - Mutual of Omaha|| FIPC|C82668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82668_01 - Germania Farm Mutual Insurance Assoc.|| FIPC|C82669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82669_01 - Northland Insurance Company|| FIPC|C82670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82670_01 - Grinnell Mutual Reinsurance Company|| FIPC|C82671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82671_01 - Texas Farm Bureau|| FIPC|C82672_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82672_01 - NGM Insurance Company|| FIPC|C82673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82673_01 - Pekin Insurance Company|| FIPC|C82674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82674_01 - Appalachian Underwriters, Inc.|| FIPC|C82675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82675_01 - Jewelers Mutual Insurance Company|| FIPC|C82676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82676_01 - American Safety Casualty Insurance Co.|| FIPC|C82696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82696_01 - Alfa Mutual Insurance Company|| FIPC|C82697_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82697_01 - Brotherhood Mutual Insurance Company|| FIPC|C82699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82699_01 - Western National Insurance|| FIPC|C82714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82714_01 - CC Services Inc.|| FIPC|C82718_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82718_01 - Elephant Insurance Services, LLC|| FIPC|C82731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82731_01 - Knightbrook Insurance|| FIPC|C82732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82732_01 - North Carolina JUA|| FIPC|C82734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82734_01 - ACE|| FIPC|C82735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82735_01 - Erie Insurance Group|| FIPC|C82736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82736_01 - Virginia Property Insurance Association|| FIPC|C82737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82737_01 - GEICO|| FIPC|C82738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82738_01 - 21st Century Insurance|| FIPC|C82739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82739_01 - Harford Mutual Insurance Company|| FIPC|C82740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82740_01 - KINSALE INSURANCE|| FIPC|C82741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82741_01 - American Financial Group|| FIPC|C82750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82750_01 - Canal Insurance Company|| FIPC|C82753_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82753_01 - James River Insurance|| FIPC|C82754_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82754_01 - Ohio Farmers Insurance|| FIPC|C82755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82755_01 - Philadelphia Insurance Company|| FIPC|C82756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82756_01 - Millers Mutual Group|| FIPC|C82758_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82758_01 - Munich Re America Services Inc.|| FIPC|C82767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82767_01 - PREMIUM CREDIT LIMITED|| FIPC|C82800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82800_01 - CAMERON MUTUAL INSURANCE CO BUREAU|| FIPC|C82801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82801_01 - IMT CORPORATION BUREAU|| FIPC|C82804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82804_01 - Insurance Data Processing|| FIPC|C82810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82810_01 - Rockford Mutual|| FIPC|C82813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82813_01 - Insurance Data Processing|| FIPC|C82816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82816_01 - Safety Insurance Com|| FIPC|C82962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82962_01 - Progressive Ins Group|| FIPC|C82966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82966_01 - PS_Mass_Auto|| FIPC|C82977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82977_01 - Farmers Insurance Hawaii|| FIPC|C82999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C82999_01 - Groupe Promutuel F�d de Soci�t� Mutuelles Assur Ge|| FIPC|C83038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83038_01 - Citizens United Reciprocal Exchange|| FIPC|C83043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83043_01 - Tokio Marine|| FIPC|C83087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83087_01 - 21st Century Insurance Group|| FIPC|C83116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83116_01 - CAA Quebec|| FIPC|C83150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83150_01 - Kemper Corportation|| FIPC|C83151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83151_01 - Allstate Insurance Company|| FIPC|C83153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83153_01 - Argo Group Us, Inc.|| FIPC|C83154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83154_01 - American International Group (AIG)|| FIPC|C83222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83222_01 - Deposit Insurance Corporation of Ontario|| FIPC|C83261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83261_01 - Ignite Insurance Corporation|| FIPC|C83287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83287_01 - Forsikrings-aktieselskabet Alka|| FIPC|C83352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83352_01 - Main Street America Assurance Company|| FIPC|C83392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83392_01 - Amerisure Companies|| FIPC|C83398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83398_01 - NORTH CAROLINA JOINT UW BUREAU|| FIPC|C83409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83409_01 - Canada Deposit Insurance Corporation|| FIPC|C83412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83412_01 - EMC Insurance Group Inc.|| FIPC|C83413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83413_01 - Country Companies|| FIPC|C83421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83421_01 - Assurant Group|| FIPC|C83434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83434_01 - OTHERS ACCOUNTS - INSURANCE|| FIPC|C83479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83479_01 - American International Group, Inc.|| FIPC|C83515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83515_01 - Lexington Insurance|| FIPC|C83546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83546_01 - ARBELLA PROTECTION INS BUREAU|| FIPC|C83592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83592_01 - Dalton Timmis Insurance Group Inc.|| FIPC|C83605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83605_01 - Plymouth Rock Assurance Corp|| FIPC|C83606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83606_01 - ACE|| FIPC|C83644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83644_01 - Commerce Ins Co|| FIPC|C83645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83645_01 - LIBERTY INTERNATIONAL UNDERWRITERS|| FIPC|C83648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83648_01 - UNIVERSAL NORTH AMERICA|| FIPC|C83653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83653_01 - Main Street America Assurance Company|| FIPC|C83658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83658_01 - Zurich Ins. Co. c/o Fidelity & Deposit|| FIPC|C83659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83659_01 - Zurich Ins. Co. c/o Maryland Casualty Co|| FIPC|C83703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83703_01 - Granada Insurance Co|| FIPC|C83718_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83718_01 - Alfa Mutual Insurance Company|| FIPC|C83723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83723_01 - American Family Insurance|| FIPC|C83726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83726_01 - American Safety Casualty Insurance Co.|| FIPC|C83727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83727_01 - AMERIPRISE FINANCIAL|| FIPC|C83728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83728_01 - Amerisure Companies|| FIPC|C83735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83735_01 - Appalachian Underwriters, Inc.|| FIPC|C83761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83761_01 - BASIN FINANCIAL|| FIPC|C83774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83774_01 - BMW FINANCIAL SERVICES|| FIPC|C83797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83797_01 - Chartis Property Casualty Company|| FIPC|C83851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83851_01 - Discover Financial Services, Inc.|| FIPC|C83880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83880_01 - Farmers Group, Inc.|| FIPC|C83882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83882_01 - Fireman's Fund Insurance Company|| FIPC|C83899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83899_01 - Granada Insurance Company|| FIPC|C83904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83904_01 - Guideone Insurance Group|| FIPC|C83907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83907_01 - Hallmark Insurance Group|| FIPC|C83926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83926_01 - Insurance Data Processing|| FIPC|C83991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C83991_01 - NATIONWIDE INSURANCE|| FIPC|C84065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84065_01 - Sammons Financial Group|| FIPC|C84073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84073_01 - Selective Insurance Company of America|| FIPC|C84140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84140_01 - Universal Insurance Group|| FIPC|C84141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84141_01 - UNIVERSAL NORTH AMERICA|| FIPC|C84188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84188_01 - Zurich Ins. Co. c/o Fidelity & Deposit|| FIPC|C84189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84189_01 - Zurich Ins. Co. c/o Maryland Casualty Co|| FIPC|C84192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84192_01 - GUARDIAN LIFE INSURANCE|| FIPC|C84193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84193_01 - AXA Equitable Life Insurance Company|| FIPC|C84273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84273_01 - UNITED FIRE GROUP|| FIPC|C84275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84275_01 - HORACE MANN (DMS)|| FIPC|C84281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84281_01 - Hallmark Insurance Group|| FIPC|C84337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84337_01 - Munich Re America Services Inc.|| FIPC|C84338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84338_01 - Maidstone Insurance Company|| FIPC|C84340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84340_01 - Access Insurance Holdings|| FIPC|C20472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C20472_01 - Progressive Insurance (PS)|| FIPC|C84385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84385_01 - CURE Insurance (DMS)|| FIPC|C84396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84396_01 - One Beacon Insurance (PS)|| FIPC|C84397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84397_01 - Premier Insurance (PS)|| FIPC|C84398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84398_01 - Starr Insurance (PS)|| FIPC|C84399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FIPC_Att|C84399_01 - Travelers (PS)|| Financial_Services|Capital_Markets|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Capital Markets|| Capital_Markets|FFSB|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FFSB|C20728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20728_01 - Financière BNC|| FFSB|C20728_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20728_02 - Financiere BNC|| FFSB|C20728_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20728_03 - Financière BNC|| FFSB|C20728_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20728_04 - Financiere BNC|| FFSB|C20771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20771_01 - Valeurs mobilières Desjardins Inc.|| FFSB|C20846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20846_01 - MF Global Canada|| FFSB|C20857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20857_01 - National Bank Correspondent Network|| FFSB|C21786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C21786_01 - W.D. Latimer Co. Ltd|| FFSB|C22266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C22266_01 - Inversiones Internacionales Gruposura S.A.|| FFSB|C29999_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C29999_07 - Other Sub Sector FFSB|| FFSB|C21969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C21969_01 - BI Management A/S|| FFSB|C21976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C21976_01 - BPI|| FFSB|C22019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C22019_01 - EBASE|| FFSB|C22064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C22064_01 - Interbolsa|| FFSB|C22106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C22106_01 - Nykredit Portefølje Administration A/S|| FFSB|C70674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C70674_01 - Agencia de valores SURA S.A.|| FFSB|C70429_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C70429_01 - Ores|| FFSB|C22066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C22066_01 - Isabel|| FFSB|C20684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20684_01 - Canada Brokerlink Group Inc.|| FFSB|C20508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C20508_01 - Scotiamclleod Inc.|| FFSB|C10467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C10467_01 - CDS - Canadian Depository for Securities|| FFSB|C82174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C82174_01 - CIBC World Markets Inc|| FFSB|C83210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C83210_01 - Investor AB|| FFSB|C83496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C83496_01 - Commonwealth Financial Network|| FFSB|C83545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFSB_Att|C83545_01 - Wellington Management|| Capital_Markets|FOMS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FOMS|C20334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20334_01 - ITG Canada Corporation|| FOMS|C11117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C11117_01 - Dubai Financial Services Authority (DIFC)|| FOMS|C11143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C11143_01 - MoneySupermarket.com Ltd|| FOMS|C20061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20061_01 - AMF - Autorite des marches financiers|| FOMS|C20061_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20061_02 - AMF - Autorité des marchés financiers|| FOMS|C20061_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20061_03 - AMF - Autorité des marchés financiers|| FOMS|C20089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20089_01 - Bourse de Montreal Inc.|| FOMS|C20894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20894_01 - Greenfield Foreign Exchange|| FOMS|C21004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21004_01 - Cellent Finance|| FOMS|C21005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21005_01 - Kordoba GmbH|| FOMS|C21033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21033_01 - TMX - Toronto Market Exchange|| FOMS|C21178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21178_01 - Doxim Inc.|| FOMS|C21781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21781_01 - Fiducia AG|| FOMS|C21785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21785_01 - CRM - Credit Risk Management Canada|| FOMS|C20429_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20429_01 - Open Solutions|| FOMS|C20429_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20429_02 - Open Solutions Inc.|| FOMS|C22355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C22355_01 - Sopra Group Bank|| FOMS|C29999_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C29999_09 - Other Sub Sector FOMS|| FOMS|C21873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21873_01 - Canadian Securities Administrators|| FOMS|C21873_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21873_02 - Canadian Securities Administrators|| FOMS|C21885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21885_01 - CHX - Chicago Stock Exchange Inc.|| FOMS|C21914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21914_01 - Les Fonds Universitas du Canada|| FOMS|C21956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21956_01 - Bankgirocentralen|| FOMS|C22126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C22126_01 - Others FS|| FOMS|C22127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C22127_01 - Others FS|| FOMS|C22160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C22160_01 - SIBS|| FOMS|C22187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C22187_01 - Upplysningscentralen|| FOMS|C22203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C22203_01 - Financial Market Other|| FOMS|C22206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C22206_01 - Other Pensions|| FOMS|C31357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C31357_01 - Capita Group|| FOMS|C31694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C31694_01 - Aarixa|| FOMS|C31695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C31695_01 - Contrast Europe|| FOMS|C51477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C51477_01 - Patria Finance Oyj|| FOMS|C60171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C60171_01 - ALMACENES FINANCIEROS SA|| FOMS|C80949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80949_01 - INTELLIGENT ENVIRONMENTS EUROPE LTD|| FOMS|C80953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80953_01 - KCG Europe Limited|| FOMS|C80373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80373_01 - Fidelity Information Services|| FOMS|C80373_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80373_02 - Fidelity Information Services|| FOMS|C80384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80384_01 - Financial Conduct Authority|| FOMS|C80462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80462_01 - Kyriba Corporation|| FOMS|C80623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80623_01 - Financial_Conduct_Authority|| FOMS|C81194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C81194_01 - Monitise|| FOMS|C80595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80595_01 - SunGard|| FOMS|C81497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C81497_01 - Sopra Group Informática S.A.|| FOMS|C40334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C40334_01 - Bankgirocentralen|| FOMS|C40379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C40379_01 - Upplysningscentralen|| FOMS|C80215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80215_01 - Regions Financial Corporation|| FOMS|C80215_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80215_02 - Regions Financial Corporation|| FOMS|C80293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C80293_01 - LGB|| FOMS|C20013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20013_01 - AEX / Euronext - Neth|| FOMS|C20013_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20013_02 - AEX / Euronext - Neth|| FOMS|C20870_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20870_02 - Equifax|| FOMS|C20870_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20870_04 - Equifax|| FOMS|C20900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20900_01 - Mature Products Bureau (USNE)|| FOMS|C21907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21907_01 - Egg|| FOMS|C31172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C31172_01 - Canadian Securities Administrators|| FOMS|C20776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20776_01 - Americredit|| FOMS|C20870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20870_01 - Equifax|| FOMS|C20221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20221_01 - Everlink Payment|| FOMS|C20221_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20221_03 - Everlink Payment|| FOMS|C20221_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20221_04 - Everlink Payment|| FOMS|C20221_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20221_05 - Everlink Payment Services Inc.|| FOMS|C20453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C20453_01 - Perimeter Financial Corporation|| FOMS|C10383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C10383_01 - Qpass Inc.|| FOMS|C21979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C21979_01 - Callatay & Wouters|| FOMS|C81701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C81701_01 - TD Auto Finance LLC|| FOMS|C81861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C81861_01 - Solutions Modex Inc|| FOMS|C81701_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C81701_02 - TD Auto Finance LLC|| FOMS|C82021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C82021_01 - FINANCIAL CONDUCT AUTHORITY|| FOMS|C82095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C82095_01 - FAIR ISAAC SERVICES LIMITED (FICO)|| FOMS|C82187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C82187_01 - Isabel SA|| FOMS|C82208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C82208_01 - Finanssi-Kontio Oy|| FOMS|C82471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C82471_01 - NexJ Systems|| FOMS|C82762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C82762_01 - World Omni|| FOMS|C82795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C82795_01 - Investissement QuTbec|| FOMS|C83011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C83011_01 - Regions Financial Corporation|| FOMS|C83077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C83077_01 - Debit Network Alliance, LLC|| FOMS|C83083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C83083_01 - Fidelity Information Services|| FOMS|C83272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C83272_01 - STW Collaboration Finance|| FOMS|C83350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C83350_01 - Fidelity Information Services|| FOMS|C83613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C83613_01 - CAN/QC - GACEQ|| FOMS|C83664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C83664_01 - NYS Banking Department|| FOMS|C84053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C84053_01 - Regions Financial Corporation|| FOMS|C84272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FOMS_Att|C84272_01 - Open solutions|| Capital_Markets|FFIS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FFIS|C20185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20185_01 - Deutsche Bank|| FFIS|C20185_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20185_02 - Deutsche Bank|| FFIS|C20233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20233_01 - Fidelity Investments|| FFIS|C20077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20077_01 - Barclays' Bank|| FFIS|C20077_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20077_02 - Barclays' Bank|| FFIS|C20077_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20077_03 - Barclays' Bank|| FFIS|C20077_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20077_04 - Barclays' Bank|| FFIS|C20077_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20077_05 - Barclays' Bank|| FFIS|C20077_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20077_06 - Barclays' Bank|| FFIS|C20077_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20077_07 - Barclays Securities India Private Limited|| FFIS|C20709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20709_01 - CA-CIB|| FFIS|C20709_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20709_07 - CA-CIB|| FFIS|C20709_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20709_08 - CA-CIB|| FFIS|C20711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20711_01 - In Retirement Services|| FFIS|C20752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20752_01 - Euroclear|| FFIS|C20752_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20752_02 - Euroclear|| FFIS|C20752_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20752_03 - Euroclear|| FFIS|C20901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20901_01 - Ramshorn Canada Investments Limited|| FFIS|C21148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21148_01 - Fidelity Corporate Finance IT|| FFIS|C21805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21805_01 - ARC Financial Corporation|| FFIS|C20506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20506_01 - Scotia Inverlat Case de Bolsa|| FFIS|C20537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20537_01 - Sun Trust Robinson Hymphre|| FFIS|C20549_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20549_07 - TD Securities|| FFIS|C20549_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20549_08 - TD Securities|| FFIS|C20651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20651_01 - IXIS CIB|| FFIS|C20660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20660_01 - Calyon|| FFIS|C20660_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20660_02 - Calyon|| FFIS|C22300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22300_01 - MUFG Union Bank, N.A|| FFIS|C22300_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22300_02 - BTMU Capital Corporation|| FFIS|C22325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22325_01 - KPMG Statsautoriseret Revisionspartnerselskab|| FFIS|C29999_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C29999_06 - Other Sub Sector FFIS|| FFIS|C21862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21862_01 - Fannie Mae|| FFIS|C21900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21900_01 - Portillion|| FFIS|C21909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21909_01 - Finagestion|| FFIS|C21909_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21909_02 - Finagestion|| FFIS|C21909_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21909_03 - Finagestion|| FFIS|C21910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21910_01 - Electra Partners LLP|| FFIS|C21917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21917_01 - Public Sector Pension Investment Board|| FFIS|C22010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22010_01 - Danske Invest Management A/S|| FFIS|C22016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22016_01 - Deutsche Bank AG London|| FFIS|C22024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22024_01 - Euroclear|| FFIS|C22025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22025_01 - Euroclear|| FFIS|C22031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22031_01 - Fidelity|| FFIS|C22102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22102_01 - Nomura Bank|| FFIS|C22153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22153_01 - SAXO Privatbank A/S|| FFIS|C22182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22182_01 - UBS|| FFIS|C22183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22183_01 - UBS|| FFIS|C31335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C31335_01 - AUSTRALIAN SECURITY & INVESTMENT COMMISSION|| FFIS|C40409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C40409_01 - Admnistradora General de Fondos SURA S.A.|| FFIS|C51652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C51652_01 - UBS Market|| FFIS|C80942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80942_01 - FIDELITY INTERNATIONAL LIMITED|| FFIS|C80951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80951_01 - INTL Commodities DMCC|| FFIS|C80973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80973_01 - RBC CAPITAL MARKETS|| FFIS|C80974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80974_01 - RBC DEXIA INVESTOR SERVICES TRUST|| FFIS|C80272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80272_01 - State Street Bank|| FFIS|C80540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80540_01 - Goldman_Sachs|| FFIS|C81182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C81182_01 - Nomura International PLC|| FFIS|C81215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C81215_01 - Societe Generale North America, Inc (de Corp)|| FFIS|C22026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22026_01 - Euroclear (Bess)|| FFIS|C81346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C81346_01 - DBS Corporate Services Private Limited|| FFIS|C22181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22181_01 - UBS|| FFIS|C22295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C22295_01 - Caixa Economica Montepio Geral|| FFIS|C40353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C40353_01 - UBS|| FFIS|C40375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C40375_01 - Euroclear|| FFIS|C21174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21174_01 - Aurelleven|| FFIS|C21847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C21847_01 - RBC Dexia Investor Services Limited|| FFIS|C80702_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80702_01 - CREDIT AGRICOLE Corporate & Investment Bank Fran|| FFIS|C80996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C80996_01 - UBS|| FFIS|C20744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20744_01 - Barep AM|| FFIS|C20843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20843_01 - AIC Funds|| FFIS|C20844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20844_01 - CI Mutual Funds Inc.|| FFIS|C20845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20845_01 - Investment Fund Services|| FFIS|C20358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20358_01 - Lincoln Financial|| FFIS|C20361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20361_01 - Loring Ward - BPC and Dr Plan|| FFIS|C20369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20369_01 - Maple Partners|| FFIS|C20514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C20514_01 - Services Financiers Poly-Protec Inc.|| FFIS|C82371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C82371_01 - Rand Merchant Bank|| FFIS|C82387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C82387_01 - PERSHING|| FFIS|C82760_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C82760_01 - Euroclear SA/NV|| FFIS|C82850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C82850_01 - Euroclear SA/NV|| FFIS|C83501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C83501_01 - Fidelity Investments|| FFIS|C83539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C83539_01 - TIAA - CREF|| FFIS|C83660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C83660_01 - UBS|| FFIS|C83741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C83741_01 - Arrowood Indemnity|| FFIS|C84158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C84158_01 - Washington Mutual Finance|| FFIS|C84191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFIS_Att|C84191_01 - UBS|| Capital_Markets|FFAM|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| FFAM|C20248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20248_01 - Fonds de solidarité des travailleurs (HRPS)|| FFAM|C20248_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20248_02 - Fonds de solidarité des travailleurs (DMS Canada)|| FFAM|C20273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20273_01 - Gluskin Sheff and Associates Inc.|| FFAM|C20276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20276_01 - GMP Private Client|| FFAM|C20277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20277_01 - Goodman Investment Council|| FFAM|C20283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20283_01 - Greystone Managed Investments Inc.|| FFAM|C20283_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20283_02 - Greystone Managed Investments Inc.|| FFAM|C20307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20307_01 - I 3 Advisors Inc.|| FFAM|C20328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20328_01 - Investissement PSP - PSP Investments|| FFAM|C20329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20329_01 - Mackenzie Financial|| FFAM|C11126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C11126_01 - Hargreaves Lansdown Asset Management Ltd|| FFAM|C20021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20021_01 - AIM Funds Managements Inc.|| FFAM|C20024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20024_01 - Schroders Investment Management|| FFAM|C20024_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20024_02 - Schroders Investment Management|| FFAM|C20096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20096_01 - Burgundy Asset Management|| FFAM|C20101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20101_01 - Caisse de depot et placement du Quebec|| FFAM|C20101_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20101_02 - Caisse de dépôt et placement du Québec|| FFAM|C20101_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20101_03 - Placement Québec|| FFAM|C20101_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20101_04 - Caisse de dépôt et placement du Québec|| FFAM|C20725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20725_01 - Fonds des professionnels|| FFAM|C20725_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20725_02 - Fonds des professionnels|| FFAM|C20772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20772_01 - Valeurs mobiliières PEAK Inc.|| FFAM|C20830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20830_01 - State Street|| FFAM|C20852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20852_01 - Fiera Capital|| FFAM|C20852_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20852_02 - Fiera Capital Inc|| FFAM|C20858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20858_01 - Raymond James Ltd.|| FFAM|C20892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20892_01 - Power Corporation of Canada|| FFAM|C20892_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20892_02 - Power Corporation of Canada|| FFAM|C20896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20896_01 - Steadyhand Investment Funds Inc.|| FFAM|C21019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21019_01 - Cumberland Asset Management|| FFAM|C21035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21035_01 - GIE AGIRC ARRCO|| FFAM|C21035_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21035_02 - GIE AGIRC ARRCO|| FFAM|C21041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21041_01 - Bull Wealth Management Group|| FFAM|C21153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21153_01 - Neuberger Berman, LLC|| FFAM|C21179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21179_01 - Global Energy Horizons Corp|| FFAM|C21788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21788_01 - CSSPEN - Co-operative Superannuation Society Pension Plan|| FFAM|C21813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21813_01 - Saskatchewan Public Employee Benefits Agency|| FFAM|C20419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20419_01 - Northern Trust|| FFAM|C20430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20430_01 - Opensky Capital|| FFAM|C20487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20487_01 - Richardson Partners|| FFAM|C20498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20498_01 - Russell Investment Group|| FFAM|C20498_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20498_02 - Russell Investment Group|| FFAM|C20569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20569_01 - Toron Capital Markets Inc.|| FFAM|C20604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20604_01 - Van Berkom and Associates Inc.|| FFAM|C20635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20635_01 - Schroders|| FFAM|C20703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20703_01 - Investors Group|| FFAM|C22323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C22323_01 - JSN Invest Holding Aps|| FFAM|C22324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C22324_01 - Juristernes og Økonomernes Pensionskasse|| FFAM|C22340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C22340_01 - Invesco Trimark Ltd|| FFAM|C29999_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C29999_08 - Other Sub Sector FFAM|| FFAM|C21867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21867_01 - Dundee Securities Corporation|| FFAM|C21876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21876_01 - Goodman and Company|| FFAM|C21888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21888_01 - Dundee Wealth Inc.|| FFAM|C21911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21911_01 - Investment Planning Counsel of Canada Limited|| FFAM|C21922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21922_01 - Ontario Pension Board|| FFAM|C21922_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21922_02 - Ontario Pension Board|| FFAM|C21928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21928_01 - EGI Financial Holdings Inc|| FFAM|C21944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21944_01 - APG|| FFAM|C22052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C22052_01 - Hargreaves Lansdown Asset Management Ltd|| FFAM|C22104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C22104_01 - Nordea Investment Management AB|| FFAM|C51921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C51921_01 - Al Amine Investment|| FFAM|C52002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C52002_01 - Dalgasgroup A/S|| FFAM|C80214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80214_01 - FGA CAPITAL S.p.A|| FFAM|C80954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80954_01 - KLEINWORT BENSON PRIVATE BANK|| FFAM|C80972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80972_01 - RATHBONE INVESTMENT MANAGEMENT|| FFAM|C80370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80370_01 - LaSalle Investment Management|| FFAM|C80534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80534_01 - FFP_Services|| FFAM|C80535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80535_01 - FIL_Investment_Management|| FFAM|C80539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80539_01 - Global_Asset_Management|| FFAM|C80561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80561_01 - Man_Group|| FFAM|C80566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80566_01 - Mondrian_Investment_Partners|| FFAM|C80572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80572_01 - Och_Ziff_Management|| FFAM|C80696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80696_01 - Professionals- Financial-Mutual Funds|| FFAM|C80750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80750_01 - Efennia Oy|| FFAM|C81191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81191_01 - FDP-Gestion privée inc.|| FFAM|C81253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81253_01 - AFP INTEGRA|| FFAM|C81313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81313_01 - FinancièredesProfessionnels|| FFAM|C60219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C60219_01 - Alliance Bernstein|| FFAM|C60219_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C60219_02 - Alliance Bernstein|| FFAM|C22351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C22351_01 - i3 Advisors Inc.|| FFAM|C80212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80212_01 - Leman Property Management Company|| FFAM|C20083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20083_01 - Bimcor|| FFAM|C20100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20100_01 - Cadim|| FFAM|C20100_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20100_02 - Cadim|| FFAM|C20909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20909_01 - Gestion DCV et Associes Inc.|| FFAM|C21012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21012_01 - Kanam Grund Kapital. mbH|| FFAM|C21034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21034_01 - Vanguard Investments Australia Ltd|| FFAM|C21804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21804_01 - Groupe Dalpé-Milette|| FFAM|C21836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21836_01 - MICA - Cabinets de services financiers|| FFAM|C21897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21897_01 - GWCM Clients|| FFAM|C21931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C21931_01 - Torch Energy Advisors Inc|| FFAM|C80946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C80946_01 - HARGREAVES LANSDOWN ASSET MANAGEMENT|| FFAM|C81362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81362_01 - Sub Sector FFPM|| FFAM|C20600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20600_01 - USA Group Inc.|| FFAM|C20681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20681_01 - All Canadian Management Inc.|| FFAM|C20713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20713_01 - CPR AM|| FFAM|C20763_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20763_02 - DGA - Desjardins gestion d'actifs|| FFAM|C20838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20838_01 - Portfolio Services|| FFAM|C20375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20375_01 - MD Management Ltd|| FFAM|C20396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20396_01 - Mulvihill Capital Management Inc.|| FFAM|C20504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20504_01 - Sceptre Investment Counsel|| FFAM|C20505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20505_01 - Scotia Cassels Investment Counsel Ltd|| FFAM|C20545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20545_01 - T.E. Investment Counsel Inc.|| FFAM|C20548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C20548_01 - TD Asset Management|| FFAM|C10428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C10428_01 - SITQ - Caisse de dépôt et placement du Québec|| FFAM|C10580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C10580_01 - ICDC - Informatique CDC|| FFAM|C51553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C51553_01 - Scribona|| FFAM|C51875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C51875_01 - Scribona|| FFAM|C81564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81564_01 - Int�grit� Risk Solutions Inc.|| FFAM|C81565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81565_01 - Wealth One Bank of Canada Inc.|| FFAM|C81663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81663_01 - AP Pensionsservice A/S|| FFAM|C81683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81683_01 - Morneau Shepell Inc.|| FFAM|C81841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81841_01 - OMERS|| FFAM|C81849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81849_01 - F.S.T.Q.|| FFAM|C81683_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81683_02 - Morneau Shepell|| FFAM|C81954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81954_01 - Quadrant Superannuatio|| FFAM|C81965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81965_01 - Morgan Stanley Dean Witter & Co.|| FFAM|C81972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81972_01 - CMG UK Pension Scheme|| FFAM|C81988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C81988_01 - Morgan Stanley|| FFAM|C82242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82242_01 - SHEPP|| FFAM|C82350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82350_01 - SHEPP|| FFAM|C82358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82358_01 - TASPLAN SUPER|| FFAM|C82414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82414_01 - CalSTRS|| FFAM|C82417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82417_01 - Morgan Stanley & Co. LLC|| FFAM|C82425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82425_01 - Investia Services Financiers Inc.|| FFAM|C82482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82482_01 - Calvin Asset Management Ltd|| FFAM|C82531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82531_01 - Sampension|| FFAM|C82627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82627_01 - Alliance Bernstein|| FFAM|C82899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C82899_01 - AMERIPRISEFINANCIAL|| FFAM|C83112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83112_01 - Morneau Shepell Inc.|| FFAM|C83148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83148_01 - CI Financial Corp.|| FFAM|C83323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83323_01 - S??st?pankkiliitto osk|| FFAM|C83325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83325_01 - S??st?pankkiliitto osk|| FFAM|C83386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83386_01 - OBOS|| FFAM|C83445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83445_01 - British Columbia Investment Management Corporation|| FFAM|C83454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83454_01 - Fidelity Investments Canada Ltd.|| FFAM|C83485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83485_01 - Bain Capital, LP|| FFAM|C83516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83516_01 - Liberty Mutual Group Asset Management, I|| FFAM|C83522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83522_01 - Nord LB|| FFAM|C83580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83580_01 - EdgePoint Wealth Management Inc.|| FFAM|C83783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83783_01 - Calyon|| FFAM|C83917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C83917_01 - HIGHGROUND ADVISORS|| FFAM|C84235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C84235_01 - Essent Guaranty Inc.|| FFAM|C84260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||FFAM_Att|C84260_01 - Synovus|| Sectors|Government|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Government|| Government|Central_and_Federal|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Central and Federal|| Central_and_Federal|GFAD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GFAD|C11096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C11096_01 - ESOC|| GFAD|C11110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C11110_01 - Bureau UK_Commercial_Non_PSA|| GFAD|C11142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C11142_01 - Capgemini HMRC|| GFAD|C11145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C11145_01 - MULTICLIENT|| GFAD|C22321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C22321_01 - Industrialiseringsfonden for Udviklingslandene|| GFAD|C30036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30036_01 - CRIQ|| GFAD|C30036_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30036_02 - CRIQ|| GFAD|C30040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30040_01 - Canada Revenue Agency|| GFAD|C30042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30042_01 - Canadian Intellectual Property Office|| GFAD|C31416_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31416_03 - EUROPEAN INSTITUTIONS|| GFAD|C31416_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31416_04 - EUROPEAN INSTITUTIONS|| GFAD|C31416_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31416_05 - EUROPEAN INSTITUTIONS|| GFAD|C31416_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31416_06 - EUROPEAN INSTITUTIONS|| GFAD|C31416_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31416_11 - EUROPEAN INSTITUTIONS|| GFAD|C31418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31418_01 - FAVV|| GFAD|C31422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31422_01 - Fødevarestyrelsen|| GFAD|C31423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31423_01 - Foreign and Commonwealth Office|| GFAD|C31426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31426_01 - Forsvarets Koncernfælles Informatiktjeneste|| GFAD|C31456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31456_01 - IBM Gov|| GFAD|C31468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31468_01 - Kirkkohallitus|| GFAD|C31471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31471_01 - Klima- og forurensningsdirektoratet KLIF|| GFAD|C31474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31474_01 - Kongsberg Seatex AS|| GFAD|C31475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31475_01 - Kotka-Haminan seutukunta|| GFAD|C31481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31481_01 - Land & Property Services (LPS)|| GFAD|C31503_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31503_01 - Migrationsverket|| GFAD|C31505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_01 - MINEFI|| GFAD|C31505_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_02 - MINEFI|| GFAD|C31505_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_03 - MINEFI|| GFAD|C31505_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_04 - MINEFI|| GFAD|C31505_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_05 - MINEFI|| GFAD|C31505_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_06 - MINEFI|| GFAD|C31505_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_09 - MINEFI|| GFAD|C31505_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31505_12 - MINEFI|| GFAD|C31507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31507_01 - MINISTERE DE LA JUSTICE|| GFAD|C31507_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31507_03 - MINISTERE DE LA JUSTICE|| GFAD|C31507_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31507_05 - MINISTERE DE LA JUSTICE|| GFAD|C31507_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31507_06 - MINISTERE DE LA JUSTICE|| GFAD|C31511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31511_01 - Ministeriet for Fødevarer, Landbrug og Fiskeri|| GFAD|C31512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31512_01 - Ministerio Adm. Interna|| GFAD|C31513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31513_01 - Ministerio da Agricultura|| GFAD|C31515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31515_01 - Ministerio da Economia, da Inovacao e do Desenvolvimento|| GFAD|C31516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31516_01 - Ministerio da Educacao|| GFAD|C31518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31518_01 - Ministerio das Financas e adm. Publica|| GFAD|C31520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31520_01 - Ministerio Negocios Estrangeiros|| GFAD|C31521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31521_01 - Ministerio Obras Publicas|| GFAD|C31522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31522_01 - Ministerio Trabalho Seg. Social|| GFAD|C31523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31523_01 - Ministry Flemish Community|| GFAD|C31530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31530_01 - Ministry of Finance|| GFAD|C31531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31531_01 - Ministry of Finance|| GFAD|C31533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31533_01 - Ministry of Finance CZ|| GFAD|C31534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31534_01 - Ministry of foreign affairs|| GFAD|C31535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31535_01 - Ministry of Interior|| GFAD|C31536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31536_01 - Ministry of Interior - Qatar|| GFAD|C31537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31537_01 - Ministry of Interior (MOI) - KSA|| GFAD|C31539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31539_01 - Ministry of Transport and Communications|| GFAD|C31542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31542_01 - Moderniseringsstyrelsen|| GFAD|C31543_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31543_02 - MoJ ? DCA|| GFAD|C31548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31548_01 - NaturErhvervstyrelsen|| GFAD|C31549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31549_01 - Naturstyrelsen|| GFAD|C31550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31550_01 - NAV okonomitjenesten|| GFAD|C31554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31554_01 - NSW ELECTORAL COMMISSION|| GFAD|C31558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31558_01 - Office of Fair Trading|| GFAD|C31560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31560_01 - Oldenburgisch-Ostfriesischer Wasserverband OOWV|| GFAD|C31572_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_02 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31572_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_03 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31572_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_04 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31572_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_05 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31572_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_06 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31572_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_09 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31572_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_11 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_01 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_02 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_03 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_04 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_05 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_06 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_07 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_09 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_11 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31573_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_12 - OTHERS CENTRAL GOVERNMENT|| GFAD|C31577_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_02 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C30929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30929_01 - CFTC - U.S. Commodity Futures Trading Commission|| GFAD|C30961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30961_01 - Government Solutions|| GFAD|C31017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31017_01 - NRC|| GFAD|C31017_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31017_02 - NRC Non-ERP|| GFAD|C31109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31109_01 - Australian Taxation Office|| GFAD|C31125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31125_01 - HMRC|| GFAD|C31137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31137_01 - OGC Buying Solutions|| GFAD|C31169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31169_01 - Developpement economique Canada|| GFAD|C31183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31183_01 - Aboriginal Affairs and Northern Development|| GFAD|C31240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31240_01 - Department of State - JFMS|| GFAD|C31241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31241_01 - Department of State - CASS|| GFAD|C31242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31242_01 - Department of State - Book Print|| GFAD|C31243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31243_01 - Department of State - Other|| GFAD|C31262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31262_01 - IMF - International Monetary Fund|| GFAD|C31302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31302_01 - Australian Bureau of Statistics|| GFAD|C31310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31310_01 - SSC - AIMS|| GFAD|C31314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31314_01 - Office of the Auditor General of Canada|| GFAD|C31314_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31314_02 - CAN/BC - Office of the Auditor General|| GFAD|C31315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31315_01 - Federal Trade Commission|| GFAD|C31316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31316_01 - Commerce/Patent and Trademark Office (PTO)|| GFAD|C31329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31329_01 - Arbetsformedlingen|| GFAD|C31330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31330_01 - Arbetsloshetskassorna|| GFAD|C31334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31334_01 - AUSTRALIAN BUREAU OF STATISTICS|| GFAD|C31336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31336_01 - AUSTRALIAN TRANSACTION & REPORTS ANALYSIS CENTRE|| GFAD|C31348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31348_01 - British Council|| GFAD|C31358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31358_01 - Central Government|| GFAD|C31361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31361_01 - CitizensAdviceBureau|| GFAD|C31367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31367_01 - Companies House|| GFAD|C31367_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31367_02 - Companies House|| GFAD|C31375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31375_01 - CSN - Centrala Studiestodsnamnden|| GFAD|C31376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31376_01 - D.E.F.R.A.|| GFAD|C31377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31377_01 - D.F.I.D.|| GFAD|C40263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C40263_01 - Lakemedelsverket|| GFAD|C40283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C40283_01 - Ministerio da Saude|| GFAD|C40384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C40384_01 - Banco de la República|| GFAD|C31577_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_03 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31577_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_04 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31577_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_05 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31577_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_06 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31577_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_11 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31577_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_12 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31581_01 - Patent-och registreringsverket|| GFAD|C31592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31592_01 - Radiotjanst|| GFAD|C31598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31598_01 - Rigspolitiet|| GFAD|C31606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31606_01 - SCB - Statistiska Centralbyran|| GFAD|C31607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31607_01 - Scottish Childrens Reporter AD|| GFAD|C31609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31609_01 - Scottish Parliament|| GFAD|C31619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31619_01 - Skatteverket|| GFAD|C31646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31646_01 - The Scottish Parliament|| GFAD|C31649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31649_01 - Transportstyrelsen|| GFAD|C31651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31651_01 - Tullverket|| GFAD|C31653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31653_01 - Udenrigsministeriet|| GFAD|C31654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31654_01 - UK Export Finance|| GFAD|C31667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31667_01 - Zentrum fur Informationsverarbeitung und Informationstech|| GFAD|C31679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31679_01 - Public Collaboration|| GFAD|C31680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31680_01 - Other Safety & Justice|| GFAD|C31682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31682_01 - Banco Central de Venezuela|| GFAD|C31683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31683_01 - CONTRALORIA GENERAL DE LA REPUBLICA DEL PERU|| GFAD|C31688_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31688_01 - Servicio Nacional de Capacitación y Empleo|| GFAD|C31698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31698_01 - DEPARTMENT OF PLANNING & COMMUNITY DEVELOPMENT (Vendor No. 105570)|| GFAD|C31705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31705_01 - Amnesty International Danmark|| GFAD|C31725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31725_01 - Erhvervsstyrelsen|| GFAD|C31762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31762_01 - Selandia|| GFAD|C31765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31765_01 - Skagen Havn|| GFAD|C31768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31768_01 - Statens Administration|| GFAD|C31769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31769_01 - Statens og Kommunernes Indkøbs Service A/S|| GFAD|C31772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31772_01 - Thyborøn Havn|| GFAD|C31799_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31799_07 - Treasury/Dept. of the|| GFAD|C31809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31809_01 - DOS/Consular Affairs (CA)|| GFAD|C39999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C39999_01 - Other Sub Sector GFAD|| GFAD|C39999_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C39999_04 - Other Sub Sector GFDV (old sub-sector)|| GFAD|C39999_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C39999_07 - Other Sub Sector GFIN (old sub-sector)|| GFAD|C70235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C70235_01 - Abu Dhabi Government Executive Council|| GFAD|C80245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80245_01 - EUROPEAN COMMISSION DIRECTORATE-GENERAL FOR ENTERPRISE AND INDUSTRY|| GFAD|C70373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C70373_01 - INDEPENDENT PRICING & REGULATORY TRIBUNAL OF NSW|| GFAD|C80945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80945_01 - FSA - FINANCIAL SERVICES AUTHORITY|| GFAD|C81029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81029_01 - BERR|| GFAD|C81036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81036_01 - FUJITSU SERVICES|| GFAD|C81048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81048_01 - OFFICE OF FAIR TRADING|| GFAD|C81049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81049_01 - Oracle Financial Services Software s.a.|| GFAD|C81053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81053_01 - Scottish Parliament|| GFAD|C81066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81066_01 - AEROSPACEINTERNATIONALSERVICESLTD|| GFAD|C81087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81087_01 - ESOC|| GFAD|C81089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81089_01 - EUMETSAT|| GFAD|C81093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81093_01 - EuropeanSpaceAgency|| GFAD|C81097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81097_01 - GNSS SUPERVISORY AUTHORITY|| GFAD|C81119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81119_01 - KONGSBERG SEATEX AS|| GFAD|C81141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81141_01 - STFC|| GFAD|C81145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81145_01 - The European Space Agency|| GFAD|C81146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81146_01 - UKSPACEAGENCY|| GFAD|C80319_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80319_02 - Defense Bills Agency|| GFAD|C80377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80377_01 - OFFICE OF DIRECTOR OF PUBLIC PROSECUTIONS|| GFAD|C80400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80400_01 - Camara de Comercio de Madrid|| GFAD|C80425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80425_01 - AUS - Defence Materiel Organisation|| GFAD|C80484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80484_01 - Logica Luxemburg|| GFAD|C80547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80547_01 - Intellectual_Property_Office|| GFAD|C80573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80573_01 - Office_for_National_Statistics|| GFAD|C80575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80575_01 - Office_Of_Rail_Regulation|| GFAD|C80576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80576_01 - OFT|| GFAD|C80588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80588_01 - Scottish_Enterprise|| GFAD|C80605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80605_01 - VOSA|| GFAD|C80616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80616_01 - BIS|| GFAD|C80651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80651_01 - PWGSC/TPSGC|| GFAD|C80653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80653_01 - Treasury Board ? GDDOCS|| GFAD|C80736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80736_01 - Fabrica Nacional de Moneda y Timbre|| GFAD|C80769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80769_01 - Passenger Focus|| GFAD|C80822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80822_01 - GAO - U. S. Government Accountability Office|| GFAD|C81179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81179_01 - Chambre de la securite financiere|| GFAD|C81259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81259_01 - Direccion General de Aeronáutica Civil|| GFAD|C81264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81264_01 - Shared Services Canada P2P|| GFAD|C81359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81359_01 - Business Innovation and Skills|| GFAD|C81427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81427_01 - Office of the Tony Clement|| GFAD|C30044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30044_01 - Canadian International Development Agency|| GFAD|C30044_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30044_02 - Canadian International Development Agency|| GFAD|C30055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30055_01 - Bureau of Indian Affairs|| GFAD|C30097_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30097_05 - Department of Justice|| GFAD|C30103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30103_01 - Developpement Economique Canada|| GFAD|C30125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30125_01 - Global Affairs Canada|| GFAD|C30134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30134_01 - Government of Canada Marketplace|| GFAD|C30134_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30134_02 - Government of Canada - Others|| GFAD|C30136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30136_01 - GTAA|| GFAD|C30141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30141_01 - Indian and Northern Affairs|| GFAD|C30141_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30141_02 - Indian and Northern Affairs|| GFAD|C30141_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30141_03 - AINC - Affaires indiennes et du Nord Canada|| GFAD|C30145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30145_01 - Industry Canada|| GFAD|C30145_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30145_02 - Industry Canada|| GFAD|C22134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C22134_01 - Prime Ministers Ofice (PMO)|| GFAD|C30546_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30546_03 - Department of State - GSS|| GFAD|C30546_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30546_04 - Department of State - Passport Agencies|| GFAD|C30548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30548_01 - General Services Administration ERP (GSA)|| GFAD|C30548_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30548_02 - General Services Administration NON ERP (GSA)|| GFAD|C30548_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30548_03 - GSA/Federal Acquisition Service (FAS)|| GFAD|C30548_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30548_04 - GSA/Federal Acquisition Service (FAS)|| GFAD|C30561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30561_01 - Office of Personnel Management|| GFAD|C30561_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30561_02 - Office of Personnel Management - NON ERP|| GFAD|C30562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30562_01 - Security Exchange Commission|| GFAD|C30565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30565_01 - USAID|| GFAD|C30578_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30578_04 - Architect of the Capitol|| GFAD|C30578_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30578_06 - DOI - Department of the Interior - NCR|| GFAD|C30579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30579_01 - Department of Treasury - ERP|| GFAD|C30579_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30579_02 - Department of Treasury - IRS|| GFAD|C30579_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30579_03 - Department of Treasury - Non ERP|| GFAD|C30579_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30579_04 - Department of Treasury|| GFAD|C30583_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30583_02 - Admin Office of US Court NON ERP|| GFAD|C30603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30603_01 - DFAIT EICS / EXCOL|| GFAD|C30607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30607_01 - Fixed fee CAS and HC Consulting|| GFAD|C30644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30644_01 - Commission de la fonction publique|| GFAD|C30679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30679_01 - Consulting and audit Canada|| GFAD|C30684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30684_01 - Office of the Superintendent of Financial Institutions|| GFAD|C30741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30741_01 - Internal Revenue Service|| GFAD|C30741_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30741_02 - Treasury/Internal Revenue Service (IRS)|| GFAD|C30777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30777_01 - Canadian Border Services Agency|| GFAD|C30784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30784_01 - FHFA|| GFAD|C30817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30817_01 - Dept of Innovation, Industry, Science and Research|| GFAD|C30820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30820_01 - CACI/Fletc|| GFAD|C30830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30830_01 - Department of Commerce ERP|| GFAD|C30830_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30830_02 - Department of Commerce Non ERP|| GFAD|C30830_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30830_03 - Department of Commerce|| GFAD|C30830_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30830_04 - Department of Commerce|| GFAD|C30874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30874_01 - Treasury Board|| GFAD|C30889_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30889_02 - Office of the Chief Information Officer|| GFAD|C30901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30901_01 - ASC - Agence spatiale canadienne|| GFAD|C30901_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30901_02 - ASC - Agence spatiale canadienne|| GFAD|C30901_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30901_03 - CSA - Canadian Space Agency|| GFAD|C30238_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30238_02 - Office of Infrastructure Canada|| GFAD|C30260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30260_01 - Public Service Commission|| GFAD|C30261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30261_01 - Public Works/Government Services Canada|| GFAD|C30261_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30261_02 - Public Works/Government Services Canada|| GFAD|C30263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30263_01 - PWGSC - ETS|| GFAD|C30263_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30263_02 - PWGSC - Secure Channel|| GFAD|C30263_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30263_03 - PWGSC - SPS|| GFAD|C30263_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30263_04 - PWGSC - SPS|| GFAD|C30263_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30263_05 - PWGSC - IBM Ottawa|| GFAD|C30263_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30263_06 - PWGSC|| GFAD|C30263_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30263_07 - CAN - PWGSC/TPSGC (PDO)|| GFAD|C30310_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30310_02 - Statistics Canada|| GFAD|C30370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30370_01 - Alladi|| GFAD|C30416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30416_01 - Carlisle City Council|| GFAD|C30417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30417_01 - The Connected Cumbria Partnership|| GFAD|C30418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30418_01 - Tribunals Services|| GFAD|C30419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30419_01 - Northumberland County Council|| GFAD|C30421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30421_01 - Tameside Metropolitain|| GFAD|C30540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30540_01 - ATO / Accenture|| GFAD|C30546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30546_01 - Department of State ERP|| GFAD|C30546_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30546_02 - Department of State - NON ERP|| GFAD|C31382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31382_01 - DEPART OF FINANCE & SERVICES (Vendor No 112079)|| GFAD|C31383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31383_01 - DEPARTMENT FOR COMMUNITIES & LOCAL GOVERNMENT (DCLG)|| GFAD|C31386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31386_01 - DEPARTMENT OF ECONOMIC DEVELOPMENT & TOURISM|| GFAD|C31389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31389_01 - DEPARTMENT OF INFRASTRUCTURE, ENERGY & RESOURCES|| GFAD|C31392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31392_01 - DEPARTMENT OF PRIME MINISTER & CABINET|| GFAD|C31395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31395_01 - DEPARTMENT OF TREASURY & FINANCE|| GFAD|C31399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31399_01 - Direktoratet for Kriminalforsorgen|| GFAD|C31403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31403_01 - E.C.|| GFAD|C31408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31408_01 - Etat de Geneve|| GFAD|C31412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31412_01 - European Commission|| GFAD|C31416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31416_01 - EUROPEAN INSTITUTIONS|| GFAD|C31416_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31416_02 - EUROPEAN INSTITUTIONS|| GFAD|C81036_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81036_02 - FUJITSU SERVICES|| GFAD|C11109_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C11109_02 - BIS (Fujitsu Services)|| GFAD|C31342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31342_01 - BIS (Fujitsu Services)|| GFAD|C81465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81465_01 - Contraloria General de la Republica|| GFAD|C81481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81481_01 - Banco de la República|| GFAD|C81486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81486_01 - Commerce/US Patent and Trademark Office (PTO)|| GFAD|C30945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30945_01 - Export Development Canada|| GFAD|C30945_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30945_02 - Export Development Canada|| GFAD|C81536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81536_01 - DFID|| GFAD|C20142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20142_01 - CIV - Treasury - International Revenue Services|| GFAD|C30149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30149_01 - Office of the Chief information and Priv|| GFAD|C30151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30151_01 - IT-SSO|| GFAD|C31671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31671_01 - Agencia Modernizacao Administrativa|| GFAD|C31673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31673_01 - Agency for Maritime Services and Coast|| GFAD|C31686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31686_01 - PROYECTO ESPEC.DE INFRAEST.DE TRASP.NACI|| GFAD|C31731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31731_01 - Folketinget|| GFAD|C60199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60199_01 - ORFANIZACION DE ESTADOS IBEROAMERICANOS|| GFAD|C60239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60239_01 - Arbetsformedlingen|| GFAD|C60240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60240_01 - Arbetsloshetskassorna|| GFAD|C60242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60242_01 - Central Government|| GFAD|C60243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60243_01 - CSN - Centrala Studiestodsnamnden|| GFAD|C60248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60248_01 - Livsmedelsverket|| GFAD|C60250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60250_01 - Migrationsverket|| GFAD|C60251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60251_01 - Patent-och registreringsverket|| GFAD|C60253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60253_01 - Radiotjanst|| GFAD|C60258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60258_01 - Skatteverket|| GFAD|C60264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60264_01 - Transportstyrelsen|| GFAD|C60266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60266_01 - Tullverket|| GFAD|C80486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80486_01 - Statens Vegvesen - Landsdekkende|| GFAD|C80545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80545_01 - HM_Land_Registry|| GFAD|C80625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80625_01 - HM_Treasury|| GFAD|C80636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80636_01 - Scottish_Government|| GFAD|C80748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80748_01 - BERR|| GFAD|C80801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C80801_01 - RWS Directie Zeeland|| GFAD|C81184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81184_01 - MINISTÈRE DU BUDGET, DES COMPTES|| GFAD|C81278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81278_01 - GSA/ChiefFinancialOfficer(OCFO)|| GFAD|C81327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81327_01 - Canadian Nuclear Safety Commission|| GFAD|C30898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30898_01 - Canadian International Trade Tribunal|| GFAD|C30907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30907_01 - Treasury Services Other|| GFAD|C30915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30915_01 - UNDP - United Nations Development Programme|| GFAD|C30928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30928_01 - The World Bank Group|| GFAD|C30993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30993_01 - Library of Parliament|| GFAD|C31041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31041_01 - AOC Solutions|| GFAD|C31104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31104_01 - Embassy of Italy|| GFAD|C31135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31135_01 - Royal Canadian Mint|| GFAD|C31145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31145_01 - Ingersoll Rand - North Carolina|| GFAD|C31192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31192_01 - Bronner|| GFAD|C31268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31268_01 - Office of the Renewable Energy Regulator|| GFAD|C31413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31413_01 - European Commission|| GFAD|C31488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31488_01 - Livsmedelsverket|| GFAD|C31519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31519_01 - Ministerio do Ambiente|| GFAD|C31532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31532_01 - Ministry of Finance|| GFAD|C31540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31540_01 - Ministry of Transport and Communications(16735)|| GFAD|C31625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31625_01 - SO Arbetsloshets-kassornas Samorganisation|| GFAD|C31669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31669_01 - AB Svensk Bilprovning|| GFAD|C30220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30220_01 - NRNS Incorporated|| GFAD|C30253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30253_01 - Passport Canada|| GFAD|C30289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30289_01 - Sénat du Canada|| GFAD|C30310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30310_01 - Statistics Canada|| GFAD|C20706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20706_01 - Australian Infrastructure|| GFAD|C20158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20158_01 - Conformite|| GFAD|C20192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20192_01 - Direction-Bureau de l'Ombudsman|| GFAD|C20193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20193_01 - Direction-Performance Organis-Gestion|| GFAD|C20193_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20193_02 - Direction-Performance Organis-Gestion|| GFAD|C20313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20313_01 - Import/Export|| GFAD|C20313_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C20313_02 - Import/Export|| GFAD|C22222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C22222_01 - Banco de Venezuela, S.A. Banco Universal|| GFAD|C22255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C22255_01 - Fondo Financiero De Proyectos De Desarrollo- Fonade|| GFAD|C22308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C22308_01 - Blokeret - Alm. Brand - brug 53281|| GFAD|C30028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30028_01 - AUS - Internal|| GFAD|C30087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30087_01 - Conseil National de Recherches du Canada|| GFAD|C30092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30092_01 - DCSF USA LLC|| GFAD|C30805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30805_01 - Canadian General Standards Board|| GFAD|C30885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30885_01 - DPW|| GFAD|C30389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30389_01 - Momentum technologies|| GFAD|C30408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30408_01 - Atlanta Housing Authority|| GFAD|C30409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30409_01 - Berkeley - Housing Authority|| GFAD|C30544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30544_01 - CACI GSA IT - Mobis|| GFAD|C30544_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30544_02 - CACI GSA IT - Mobis|| GFAD|C30545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30545_01 - Department of the Interior|| GFAD|C30553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30553_01 - Zims|| GFAD|C30559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30559_01 - Credit Solutions Maintenance|| GFAD|C30564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30564_01 - State of Virginia|| GFAD|C30566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30566_01 - WCB NS|| GFAD|C30588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30588_01 - Department of Health, NS|| GFAD|C30605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30605_01 - Columbus Meteropolitain Housing Authority|| GFAD|C30608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30608_01 - Recoveries|| GFAD|C30609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30609_01 - Support and Maintenance E-Rims|| GFAD|C30681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30681_01 - PBGC - Pension Benefit Guranty Corporation|| GFAD|C60256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C60256_01 - SCB - Statistiska Centralbyran|| GFAD|C10820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C10820_01 - ROC Consulting Group Inc.|| GFAD|C40298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C40298_01 - Region Hovedstaden|| GFAD|C40299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C40299_01 - Region Hovedstaden|| GFAD|C70318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C70318_01 - Emirates Identity Authority (EIDA)|| GFAD|C81552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81552_01 - CAN - Dept of Foreign Affairs, Trade & Devt Canada|| GFAD|C81553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81553_01 - DOS/US Agency for International Dev. (USAID)|| GFAD|C31348_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31348_02 - British Council|| GFAD|C81577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81577_01 - FMD SERVICES|| GFAD|C81578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81578_01 - LIBRARY OF PARLIAMENT|| GFAD|C81606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81606_01 - Safety Codes Council|| GFAD|C81614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81614_01 - FINANCIAL CONDUCT AUTHORITY|| GFAD|C81689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81689_01 - C81689_01 - DOI - Department of Interior|| GFAD|C81704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81704_01 - Rahandusministeeriumi Infotehnoloogiakes|| GFAD|C81637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81637_01 - Styrelsen for Videreg?ende Uddannelser|| GFAD|C31242_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31242_02 - DoS - Department of State|| GFAD|C30777_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30777_02 - CAN - Canada Border Services Agency|| GFAD|C81784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81784_01 - Jernbaneverket|| GFAD|C81808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81808_01 - European Patent Office|| GFAD|C81809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81809_01 - UWV|| GFAD|C81814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81814_01 - Ministry of Internal Affaires|| GFAD|C81817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81817_01 - Belastingdienst|| GFAD|C81818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81818_01 - SSC DJI|| GFAD|C81822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81822_01 - RDW|| GFAD|C81835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81835_01 - Ministerie van BUZA|| GFAD|C81843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81843_01 - SERVICES OR LP|| GFAD|C81359_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81359_02 - Business Innovation and Skills|| GFAD|C81912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81912_01 - National Film Board of Canada|| GFAD|C81916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81916_01 - Rideau Hall Foundation|| GFAD|C81949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81949_01 - UGAP|| GFAD|C81992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81992_01 - Canadian Securities Administrators|| GFAD|C81995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C81995_01 - Treasury/Internal Revenue Service (IRS)|| GFAD|C31535_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31535_02 - GENZYME|| GFAD|C31577_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_09 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31577_01 - OTHERS PUBLIC INSTITUTIONS|| GFAD|C31572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_01 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C30875_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C30875_04 - Treasury/Financial Management Service (FMS)|| GFAD|C82207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82207_01 - Eduskunta|| GFAD|C82214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82214_01 - Kansaneläkelaitos KELA|| GFAD|C82237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82237_01 - Valtioneuvoston kanslia|| GFAD|C82246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82246_01 - CAN - Parliament of Canada|| GFAD|C82248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82248_01 - National Capital Commission|| GFAD|C82288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82288_01 - Ministerstvo financii SR|| GFAD|C82436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82436_01 - Cabinet Office - CERT-UK|| GFAD|C82441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82441_01 - Crown Commercial Service|| GFAD|C82442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82442_01 - Crown Estate|| GFAD|C82444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82444_01 - Competition & Markets Authority|| GFAD|C82472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82472_01 - Investment Industry Regulatory Organization of CAN|| GFAD|C82493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82493_01 - DICTU|| GFAD|C82499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82499_01 - Ministry of Justice|| GFAD|C82864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82864_01 - OSFI - Testers and Test Lead|| GFAD|C82865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82865_01 - OSFI - Architecture Support|| GFAD|C82866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82866_01 - OSFI - SOA|| GFAD|C82867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82867_01 - Shared Services Canada - Staff Aug|| GFAD|C82868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82868_01 - SSC - NETWORK|| GFAD|C82869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82869_01 - SSC-ENTERPRISE|| GFAD|C82870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82870_01 - SSC-MIDRANGE|| GFAD|C82871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82871_01 - Public Works and Government Svcs Canada|| GFAD|C82872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82872_01 - PWGSC - ERP STREAM 2|| GFAD|C82874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82874_01 - PWGSC - AMITOS|| GFAD|C82991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C82991_01 - Department of Premier and Cabinet|| GFAD|C83050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83050_01 - STATE PENALTIES ENFORCEMENT REGISTRY|| GFAD|C83028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||To_be_Classified_Att|C83028_01 - HWG Group - Internal|| GFAD|C83345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83345_01 - Western Australian Electoral Commission|| GFAD|C83356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83356_01 - CAN/ON - Treasury Board Secretariat|| GFAD|C83381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83381_01 - Skatteetaten|| GFAD|C83399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83399_01 - CAN/BC - Office of the Auditor General|| GFAD|C31572_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_12 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31572_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31572_13 - OTHERS CENTRAL ADMINISTRATIONS|| GFAD|C31573_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_13 - OTHERS CENTRAL GOVERNMENT|| GFAD|C83470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83470_01 - CAN/ON - Treasury Board Secretariat|| GFAD|C83549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83549_01 - FL - State of Florida|| GFAD|C83600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83600_01 - Department of State - OBO|| GFAD|C83612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83612_01 - DoS - Department of State|| GFAD|C83616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83616_01 - Provincial Auditor of Saskatchewan|| GFAD|C31573_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31573_10 - OTHERS CENTRAL GOVERNMENT|| GFAD|C83657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83657_01 - New Jersey Office of Management and Bud|| GFAD|C83669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83669_01 - State Board of Equalization|| GFAD|C83748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83748_01 - BALTIMORE COUNTY BUDGET & FINANCE|| GFAD|C83781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C83781_01 - Bureau of Indian Affairs|| GFAD|C84119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C84119_01 - TEXAS COMPTROLLER OF PUBLIC ACCOUNTS|| GFAD|C84147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C84147_01 - VIRGINIA DEPARTMENT OF TAXATION|| GFAD|C84212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C84212_01 - State Board of Equalization|| GFAD|C84336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C84336_01 - VIRGINIA DEPARTMENT OF TAXATION|| GFAD|C84349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C84349_01 - Commerce/US Patent and Trademark Office (PTO)|| Central_and_Federal|GFRE|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GFRE|C22243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C22243_01 - Centro de Capacitación y Tecnología del Aprendizaje|| GFRE|C22263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C22263_01 - Instituto Antartico Chileno|| GFRE|C30008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30008_01 - Agriculture and Agri-Food Canada|| GFRE|C30008_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30008_02 - Agriculture and Agri-Food Canada|| GFRE|C30096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30096_01 - CAN - Dept of Fisheries and Oceans|| GFRE|C30096_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30096_02 - CAN - Dept of Fisheries and Oceans|| GFRE|C30547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30547_01 - US Environmental Protection Agency ERP|| GFRE|C30547_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30547_02 - US Environmental Protection Agency - NON ERP|| GFRE|C30547_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30547_03 - US Environmental Protection Agency|| GFRE|C30547_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30547_04 - EPA IT Infrastructure|| GFRE|C30547_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30547_05 - EPA Program IT Solutions|| GFRE|C30578_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30578_05 - DOI - Department of the Interior- EEOC|| GFRE|C30580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30580_01 - US Department of Agriculture - ERP|| GFRE|C30580_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30580_02 - US Department of Agriculture - Non ERP|| GFRE|C30867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30867_01 - Department of Sustainability and Environment|| GFRE|C30889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30889_01 - USDA/Chief Information Officer (OCIO)|| GFRE|C30213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30213_01 - National Energy Board|| GFRE|C30262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30262_01 - Pêches et Océans Canada|| GFRE|C31393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31393_01 - DEPARTMENT OF ENVIRONMENT & PRIMARY INDUSTRIES|| GFRE|C31430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31430_01 - General Register Office for Scotland|| GFRE|C31453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31453_01 - Hogskoleverket|| GFRE|C31508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_01 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_02 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_03 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_04 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_05 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_06 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_07 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_09 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_12 - MINISTERE DE L'ECOLOGIE|| GFRE|C31524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31524_01 - Ministry of Agriculture and Forestry|| GFRE|C31525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31525_01 - Ministry of Culture CZ-National Library|| GFRE|C30953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30953_01 - Department of Climate Change|| GFRE|C31055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31055_01 - Australian Government|| GFRE|C31083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31083_01 - US Department of Energy|| GFRE|C31224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31224_01 - Orer|| GFRE|C31282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31282_01 - Clean Energy Regulator|| GFRE|C31305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31305_01 - USDA/Natural Resource Conservation Service (NRCS)|| GFRE|C31326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31326_01 - Aktieselskapet Vinmonopolet|| GFRE|C31333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31333_01 - AUSTRALIA COMMUNICATION & MEDIA AUTHORITY|| GFRE|C31585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31585_01 - PRIA|| GFRE|C31599_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31599_07 - USDA/Risk Management Agency (RMA)|| GFRE|C31608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31608_01 - Scottish Government|| GFRE|C31617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31617_01 - Skat|| GFRE|C31618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31618_01 - SKAT|| GFRE|C31623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31623_01 - SMHI|| GFRE|C31629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31629_01 - Spærret - Plantedirektoratet - brug 50913|| GFRE|C31672_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31672_01 - Agency for Agriculture and Fisheries|| GFRE|C31678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31678_01 - Ministry of Infrastructure and the Environment|| GFRE|C31690_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31690_01 - Superintendencia de Servicios Sanitarios|| GFRE|C31720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31720_01 - Energistyrelsen|| GFRE|C31730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31730_01 - Fiskeridirektoratet|| GFRE|C31773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31773_01 - Tradium|| GFRE|C39999_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C39999_06 - Other Sub Sector GFRE|| GFRE|C51552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C51552_01 - Scottish Government|| GFRE|C70286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C70286_01 - Diversos|| GFRE|C60277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C60277_01 - Government|| GFRE|C70332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C70332_01 - Environment|| GFRE|C70372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C70372_01 - ICT Qatar|| GFRE|C81046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81046_01 - MET OFFICE|| GFRE|C81092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81092_01 - EUROPEAN ORGANIZATION FOR NUCLEAR RESEAR|| GFRE|C80453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C80453_01 - USDA/ACFO-FS|| GFRE|C80514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C80514_01 - CEFAS|| GFRE|C80790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C80790_01 - USDA/Forest Service (FS)|| GFRE|C80821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C80821_01 - USDA/Food & Nutrition Service (FNS)|| GFRE|C81360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81360_01 - Department of Energy and Climate|| GFRE|C81378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81378_01 - USDA/Agricultural Marketing Service|| GFRE|C31756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31756_01 - Miljøministeriet|| GFRE|C60238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C60238_01 - Almi Foretagspartner|| GFRE|C60272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C60272_01 - Hogskoleverket|| GFRE|C81310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81310_01 - USDA/FarmServiceAgency(FSA)|| GFRE|C30927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30927_01 - Parks Canada|| GFRE|C30944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30944_01 - Electricity Sector Council|| GFRE|C30946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30946_01 - Grand Site Sainte-Victoire|| GFRE|C31131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31131_01 - Natural Sciences and Eng Research|| GFRE|C31131_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31131_02 - Natural Sciences and Eng Research|| GFRE|C31327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31327_01 - Almi Foretagspartner|| GFRE|C30270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30270_01 - Ressources Naturelles du Canada|| GFRE|C30270_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30270_02 - Natural Resources Canada|| GFRE|C30041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30041_01 - Canadian Food Inspection Agency|| GFRE|C30041_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30041_02 - Canadian Food Inspection Agency|| GFRE|C51274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C51274_01 - Forest|| GFRE|C30587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30587_01 - Ressources Naturelles du Canada|| GFRE|C30682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30682_01 - Environment Canada|| GFRE|C60260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C60260_01 - SMHI|| GFRE|C70640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C70640_01 - Environment|| GFRE|C81631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81631_01 - Milj?styrelsen|| GFRE|C30682_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30682_02 - CAN - Environment Canada|| GFRE|C81824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81824_01 - Other Infra & Environment, Decentral Gov|| GFRE|C81836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81836_01 - Ministerie van Infrastructuur en Milieu|| GFRE|C81939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81939_01 - USDA/Farm Service Agency (FSA)|| GFRE|C81960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C81960_01 - Alberta Energy Regulator|| GFRE|C30096_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C30096_03 - CAN/NB - Dept of Agr. & Aquaculture & Fisheries|| GFRE|C82125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C82125_01 - Statens energimyndighet|| GFRE|C82268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C82268_01 - Naturvardsverket|| GFRE|C82353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C82353_01 - DEPARTMENT OF THE ENVIRONMENT|| GFRE|C82433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C82433_01 - Forestry Commission|| GFRE|C82877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C82877_01 - Parks Canada|| GFRE|C83012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C83012_01 - EPA ORD|| GFRE|C83106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C83106_01 - USDA|| GFRE|C83343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C83343_01 - Weda Skog|| GFRE|C31508_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_13 - MINISTERE DE L'ECOLOGIE|| GFRE|C31508_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFRE_Att|C31508_11 - MINISTERE DE L'ECOLOGIE|| Central_and_Federal|GFJU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GFJU|C11129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C11129_01 - HMG8|| GFJU|C11129_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C11129_02 - HMG8|| GFJU|C11129_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C11129_03 - HMG8|| GFJU|C11131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C11131_01 - Home Office|| GFJU|C30097_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30097_02 - Department of Justice - FBI|| GFJU|C30097_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30097_03 - Department of Justice - ERP|| GFJU|C30097_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30097_04 - Department of Justice - ATF|| GFJU|C30097_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30097_06 - Department of Justice|| GFJU|C30578_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30578_07 - US Capitol Police|| GFJU|C30583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30583_01 - Admin Office of US Court ERP|| GFJU|C30833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30833_01 - Ministere de la Justice Canada|| GFJU|C30833_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30833_02 - Justice Canada|| GFJU|C30259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30259_01 - Public Safety and Emergency Preparedness C|| GFJU|C30265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30265_01 - RCMP - Royal Canadian Mounted Police|| GFJU|C31384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31384_01 - DEPARTMENT OF ATTORNEY GENERAL & JUSTICE|| GFJU|C31390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31390_01 - DEPARTMENT OF JUSTICE & ATTORNEY-GENERAL (Vendor No 6000337)|| GFJU|C31396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31396_01 - DEPT OF POLICE & EMERGENCY MANAGEMENT|| GFJU|C31400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31400_01 - Domstoladministrasjonen|| GFJU|C31401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31401_01 - Domstolsverket|| GFJU|C31406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31406_01 - Ekobrottsmyndigheten|| GFJU|C31476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31476_01 - Kriminalvarden|| GFJU|C31507_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31507_02 - MINISTERE DE LA JUSTICE|| GFJU|C31507_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31507_04 - MINISTERE DE LA JUSTICE|| GFJU|C31507_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31507_09 - MINISTERE DE LA JUSTICE|| GFJU|C31517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31517_01 - Ministerio da Justica|| GFJU|C31538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31538_01 - Ministry of justice|| GFJU|C31543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31543_01 - Ministry of Justice|| GFJU|C31552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31552_01 - Home Office PND|| GFJU|C31040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31040_01 - CAN - Department of Justice|| GFJU|C31105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31105_01 - Australian Federal Police|| GFJU|C31234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31234_01 - Department of Justice - JMD|| GFJU|C31235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31235_01 - Department of Justice - USMS|| GFJU|C31273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31273_01 - Office of the Privacy Commissioners of Canada|| GFJU|C31304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31304_01 - Attorney-General's Department|| GFJU|C31325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31325_01 - aklagarmyndigheten|| GFJU|C31349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31349_01 - Brottsforebyggande radet|| GFJU|C31372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31372_01 - CROWN LAW-DEPT OF JUSTICE & ATTORNEY GEN|| GFJU|C31373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31373_01 - Crown Prosecution Service|| GFJU|C31593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31593_01 - Rattsmedicinalverket|| GFJU|C31599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31599_01 - Rikspolisstyrelsen|| GFJU|C31677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31677_01 - MinistryofJusticeandSafety|| GFJU|C31709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31709_01 - Beredskabsstyrelsen|| GFJU|C31742_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31742_01 - Justitsministeriet|| GFJU|C39999_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C39999_05 - Other Sub Sector GFJU|| GFJU|C60311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C60311_01 - Rikspolisstyrelsen|| GFJU|C81033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81033_01 - Crown Office and Procurator|| GFJU|C81054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81054_01 - SCOTTISH PRISON SERVICE|| GFJU|C80368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80368_01 - Thames Valley Probation Area|| GFJU|C80518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80518_01 - Civil_Nuclear_Police_Authority|| GFJU|C80522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80522_01 - CPS|| GFJU|C80523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80523_01 - Crown_Office_&_Procurator_Fiscal_Service|| GFJU|C80582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80582_01 - Planning_Inspectorate|| GFJU|C80589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80589_01 - Scottish_Prison_Service|| GFJU|C80633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80633_01 - MOJ|| GFJU|C81386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81386_01 - CAN - Courts Administration Services|| GFJU|C31804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31804_01 - CAN-Office of the Commissioner of Review Tribunals|| GFJU|C60274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C60274_01 - Brottsforebyggande radet|| GFJU|C60275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C60275_01 - Domstolsverket|| GFJU|C60276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C60276_01 - Ekobrottsmyndigheten|| GFJU|C60278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C60278_01 - Kriminalvarden|| GFJU|C60279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C60279_01 - Rattsmedicinalverket|| GFJU|C60281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C60281_01 - aklagarmyndigheten|| GFJU|C80664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80664_01 - DOJ/Federal Bureau of Investigation (FBI)|| GFJU|C81005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81005_01 - Kent Fire and Rescue Service|| GFJU|C81167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81167_01 - DOJ/Federal Bureau of Investigation (FBI)|| GFJU|C81316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81316_01 - DOJ/JusticeManagementDivision(JMD)|| GFJU|C31214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31214_01 - Legislative Agencies|| GFJU|C31462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31462_01 - Justice|| GFJU|C31589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31589_01 - Public Safety|| GFJU|C31632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31632_01 - Statens Kriminaltekniska Lab|| GFJU|C30327_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30327_02 - AOUSC / Accounting and Financial|| GFJU|C30327_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30327_03 - AOUSC - Administrative Office of the US Courts|| GFJU|C30816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30816_01 - National Parole Board|| GFJU|C30683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C30683_01 - Correctional Service Canada|| GFJU|C80011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80011_01 - CPS Energy|| GFJU|C80011_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C80011_02 - CPS Energy|| GFJU|C81596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81596_01 - CAN - Dept of Justice|| GFJU|C81616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81616_01 - Competition Appeal Tribunal|| GFJU|C31040_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31040_02 - Cree Department of Justice and Correctional Servic|| GFJU|C81797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81797_01 - MOI QATAR|| GFJU|C31040_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31040_03 - CA - Correctional Health Care|| GFJU|C81812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81812_01 - Nationale Politie|| GFJU|C31040_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C31040_04 - CAN - Correctional Services Canada|| GFJU|C81596_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C81596_02 - CAN/NB - Dept of Justice|| GFJU|C82115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C82115_01 - Chalmers Tekniska h�gskola AB|| GFJU|C82124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C82124_01 - Konsumentverket|| GFJU|C82347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C82347_01 - North Wales Police|| GFJU|C82492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C82492_01 - CJIB|| GFJU|C82494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C82494_01 - Europol|| GFJU|C82512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C82512_01 - Federale Politie|| GFJU|C83149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C83149_01 - Correctional Services Canada|| GFJU|C83364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C83364_01 - Justitie Kerndepartement|| GFJU|C83368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C83368_01 - Rechtspleging en handhaving|| GFJU|C83371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C83371_01 - Straffen en beschermen|| GFJU|C83380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C83380_01 - Politiet|| GFJU|C83607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C83607_01 - ATTORNEY-GENERALS DEPARTMENT|| GFJU|C83832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFJU_Att|C83832_01 - CPS ENERGY|| Central_and_Federal|GEOD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GEOD|C22288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C22288_01 - Sunión Educación Integral S.A.|| GEOD|C22330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C22330_01 - Roskilde Tekniske Skole (NH)|| GEOD|C30012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30012_01 - AB Innov & Adv Educ|| GEOD|C30016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30016_01 - Alberta - Education|| GEOD|C30078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30078_01 - College of Dupage, IL|| GEOD|C30128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30128_01 - Fresno Unified School District|| GEOD|C30148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30148_01 - Institut Nationale de la Recherche|| GEOD|C30556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30556_01 - NB Department of Education|| GEOD|C30557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30557_01 - NB Dept of Post-Secondary Education|| GEOD|C30589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30589_01 - Dept of Education, NB|| GEOD|C30598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30598_01 - NS Community College|| GEOD|C30687_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30687_01 - University of Ottawa|| GEOD|C30687_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30687_02 - University of Ottawa|| GEOD|C30743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30743_01 - Oakland Intermediate School District|| GEOD|C30743_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30743_02 - Oakland Intermediate School District|| GEOD|C30757_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30757_01 - Iowa State University|| GEOD|C30757_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30757_02 - Iowa State University|| GEOD|C30778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30778_01 - University of Minnesota|| GEOD|C30778_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30778_02 - US/MN University of Minnesota|| GEOD|C30788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30788_01 - TELUQ - Télé-Université (Université du Québec)|| GEOD|C30788_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30788_02 - Université du Québec|| GEOD|C30812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30812_01 - Ontario Ministry of Education|| GEOD|C30839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30839_01 - Universite du Quebec a Chicoutimi (UQAC)|| GEOD|C30868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30868_01 - University of Nebraska|| GEOD|C30869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30869_01 - Wilfrid Laurier University|| GEOD|C30897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30897_01 - Northern Illinois University|| GEOD|C30902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30902_01 - VA Prince Williams County Schools|| GEOD|C30902_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30902_02 - VA Prince Williams County Schools|| GEOD|C30902_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30902_03 - VA Prince Williams County Schools|| GEOD|C30909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30909_01 - Seneca College|| GEOD|C30185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30185_01 - BC - Ministry of Education|| GEOD|C30223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30223_01 - NY Dept of Education|| GEOD|C30227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30227_01 - NYC Board of Education|| GEOD|C30326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30326_01 - University of Nevada|| GEOD|C30368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30368_01 - Yonkers Public Schools|| GEOD|C30369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30369_01 - Aldine Independent School District|| GEOD|C30369_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30369_02 - Aldine Public Schools|| GEOD|C30369_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30369_03 - Aldine Independent School District|| GEOD|C30373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30373_01 - Baltimore County - Public Schools|| GEOD|C30373_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30373_02 - Baltimore County - Public Schools|| GEOD|C30373_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30373_03 - Baltimore County - Public Schools|| GEOD|C30373_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30373_04 - Baltimore County - Public Schools|| GEOD|C30377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30377_01 - Cherry Creek School District|| GEOD|C30379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30379_01 - Cobb County Schools|| GEOD|C30379_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30379_03 - Cobb County Schools|| GEOD|C30380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30380_01 - Conseil scol. pub. district Centre-S.O.|| GEOD|C30387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30387_01 - MELS - Ministère de l'education, du loisir et du sport|| GEOD|C30387_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30387_02 - MELS - Ministère de l'education, du loisir et du sport|| GEOD|C30390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30390_01 - Northern Arizona Univesrity|| GEOD|C30391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30391_01 - Olds College|| GEOD|C30392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30392_01 - OECM - Ontario Education Collaborative Mktplace|| GEOD|C30392_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30392_02 - OECM - Ontario Education Collaborative Mktplace|| GEOD|C30394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30394_01 - Savannah Public Schools|| GEOD|C30395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30395_01 - Philidelphia School District|| GEOD|C30396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30396_01 - Southern Alberta Institute of Technology|| GEOD|C30397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30397_01 - Seminaire de Chicoutimi|| GEOD|C30399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30399_01 - Universite Laval|| GEOD|C30401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30401_01 - Universite Montreal|| GEOD|C31387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31387_01 - DEPARTMENT OF EDUCATION (TASMANIA)|| GEOD|C31397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31397_01 - Dept. for Education|| GEOD|C31402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31402_01 - DTU|| GEOD|C31405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31405_01 - Education|| GEOD|C31419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31419_01 - FH Dusseldorf|| GEOD|C31461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31461_01 - Jonkopings Kommun|| GEOD|C31466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31466_01 - KAMK|| GEOD|C31470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31470_01 - Kiruna kommun|| GEOD|C31497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31497_01 - Lunds Kommun|| GEOD|C31510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_01 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_02 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_03 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_04 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_05 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_06 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_09 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_11 - MINISTERE EDUCATION NATIONALE|| GEOD|C31510_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31510_12 - MINISTERE EDUCATION NATIONALE|| GEOD|C31527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31527_01 - Ministry of Education and Culture|| GEOD|C31528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31528_01 - Ministry of Education CZ|| GEOD|C31545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31545_01 - Nacka Kommun|| GEOD|C30919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30919_01 - California State Polytechnic University|| GEOD|C30921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30921_01 - Commission scolaire des Premières-Seigneuries|| GEOD|C30937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30937_01 - Universite MHWGll|| GEOD|C30938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30938_01 - Centenary College|| GEOD|C30967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30967_01 - Institut universitaire en santé mentale de Québec|| GEOD|C30985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30985_01 - Anne Arundel Public School Disctrict|| GEOD|C30985_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30985_02 - Anne Arundel Public School Disctrict|| GEOD|C30985_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30985_03 - Anne Arundel Public School Disctrict|| GEOD|C30988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30988_01 - West Virginia University|| GEOD|C30989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30989_01 - Cégep Limoilou|| GEOD|C30999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30999_01 - International Academy of Design and Technology|| GEOD|C31019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31019_01 - Universite de Montreal|| GEOD|C31024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31024_01 - Oakland School District, Michigan|| GEOD|C31063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31063_01 - Dominican University|| GEOD|C31069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31069_01 - College of Nurses Of Ontario|| GEOD|C31071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31071_01 - College and Association of Registered Nurses of Alberta|| GEOD|C31122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31122_01 - Texas Christian University|| GEOD|C31122_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31122_02 - Texas Christian University|| GEOD|C31141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31141_01 - Carleton University|| GEOD|C31149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31149_01 - NYS - Education Department|| GEOD|C31153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31153_01 - College of Alberta Psychologists|| GEOD|C31158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31158_01 - Commission Scolaire de Laval|| GEOD|C31176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31176_01 - University of Massachussetts - Medical School|| GEOD|C31186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31186_01 - BC - Ministry of Advanced Education|| GEOD|C31210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31210_01 - Department of Education|| GEOD|C31244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31244_01 - Eastern Michigan University|| GEOD|C31245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31245_01 - Kent State University|| GEOD|C31252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31252_01 - CS Viamonde|| GEOD|C31275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31275_01 - Vancouver Community College|| GEOD|C31276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31276_01 - Seattle Pacific University Inc.|| GEOD|C31276_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31276_02 - Seattle Pacific University Inc.|| GEOD|C31288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31288_01 - Mississipi State University|| GEOD|C31292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31292_01 - First Nations University of Canada|| GEOD|C31292_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31292_02 - First Nations University of Canada|| GEOD|C31317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31317_01 - Erie1boces|| GEOD|C31339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31339_01 - Berufsgenossenschaft Holz und Metall|| GEOD|C31345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31345_01 - Borlange Kommun|| GEOD|C31346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31346_01 - Botkyrka kommun|| GEOD|C31347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31347_01 - Boverket|| GEOD|C31368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31368_01 - CORPTECH (Vendor No 319414)|| GEOD|C40256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C40256_01 - Hogskolorna|| GEOD|C31620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31620_01 - Skelleftea kommun|| GEOD|C31628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31628_01 - Sodertalje Kommun|| GEOD|C31633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31633_01 - Statens Provnings- och Forskningsintitut|| GEOD|C31634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31634_01 - Stiftung Warentest|| GEOD|C31638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31638_01 - Syddansk Universitet|| GEOD|C31644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31644_01 - TERTIARY EDUCATION QUALITY & STANDARDS AGENCY|| GEOD|C31655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31655_01 - Styrelsen for It og L�ring|| GEOD|C31656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31656_01 - UNI-IT/ØSS-samarbejdet|| GEOD|C31657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31657_01 - UNI-IT/STADS-samarbejdet|| GEOD|C31658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31658_01 - UNI-IT/UPS|| GEOD|C31661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31661_01 - UNIVERSITY OF TASMANIA|| GEOD|C31662_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31662_01 - Uppsala Kommun|| GEOD|C31668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31668_01 - Aarhus Universitet|| GEOD|C31675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31675_01 - Education|| GEOD|C31684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31684_01 - Corp. Santo Tomás para el Desarrollo Educación y Cultura Ltda.|| GEOD|C31700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31700_01 - Aalborg Handelsskole|| GEOD|C31701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31701_01 - Aalborg Kommune|| GEOD|C31702_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31702_01 - Aalborg Universitet|| GEOD|C31704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31704_01 - Aarhus Universitet|| GEOD|C31706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31706_01 - AMU Syd|| GEOD|C31707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31707_01 - AMU-Vest|| GEOD|C31708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31708_01 - AOF Danmark|| GEOD|C31711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31711_01 - Blokeret - CEU Herning - brug 59250|| GEOD|C31712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31712_01 - Campus Bornholm|| GEOD|C31713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31713_01 - Campus Vejle|| GEOD|C31715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31715_01 - Copenhagen Business School, CBS|| GEOD|C31716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31716_01 - CPH West|| GEOD|C31717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31717_01 - CVU - Vest|| GEOD|C31721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31721_01 - Erhvervsakademi Århus|| GEOD|C31722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31722_01 - Erhvervsakademi Dania|| GEOD|C31723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31723_01 - Erhvervsakademi Sydvest|| GEOD|C31724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31724_01 - Erhvervsakademiet Lillebælt|| GEOD|C31727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31727_01 - EUC SYD|| GEOD|C31728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31728_01 - EUC Vest|| GEOD|C31735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31735_01 - Hansenberg|| GEOD|C31736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31736_01 - Herningsholm Erhvervsskole|| GEOD|C31738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31738_01 - Horsens Handelskole|| GEOD|C31740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31740_01 - International Business College|| GEOD|C31741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31741_01 - IT-Universitet i København|| GEOD|C31746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31746_01 - Københavns Universitet|| GEOD|C31747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31747_01 - Københavns Universitet|| GEOD|C31748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31748_01 - KøbenhavnsTekniske Skole|| GEOD|C31750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31750_01 - Kold College|| GEOD|C31755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31755_01 - Mercantec|| GEOD|C31759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31759_01 - Professionshøjskole UCC København|| GEOD|C31760_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31760_01 - Roskilde Tekniske Skole|| GEOD|C31761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31761_01 - Rybners Handelsskole|| GEOD|C31763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31763_01 - Silkeborg Handelsskole|| GEOD|C31764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31764_01 - Silkeborg Tekniske Skole|| GEOD|C31766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31766_01 - Skive Handelsskole|| GEOD|C31767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31767_01 - Skive Tekniske Skole|| GEOD|C31770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31770_01 - Syddansk Erhvervsskole Odense-Vejle|| GEOD|C31771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31771_01 - Tech College Aalborg|| GEOD|C31774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31774_01 - Uddannelsescenter Holstebro|| GEOD|C31775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31775_01 - Uddannelsescenter Holstebro|| GEOD|C31779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31779_01 - University College Nordjylland|| GEOD|C31780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31780_01 - University College Sjælland|| GEOD|C31781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31781_01 - University Nordjylland|| GEOD|C31782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31782_01 - Viden Djurs|| GEOD|C39999_28|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C39999_28 - Other Sub Sector GEOD|| GEOD|C52015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C52015_01 - Dansk Skoleforening for Sydslesvig|| GEOD|C52068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C52068_01 - Folkehøjskolernes Forening I Danmark|| GEOD|C52297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C52297_01 - TEC|| GEOD|C70424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C70424_01 - ONI|| GEOD|C81004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81004_01 - College of Policing|| GEOD|C80267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80267_01 - Duke University|| GEOD|C80324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80324_01 - CONSEJERIA DE EDUCACION|| GEOD|C80451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80451_01 - UNIVERSITY OF CANBERRA|| GEOD|C80465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80465_01 - HEC Montreal|| GEOD|C80469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80469_01 - Hocking Technical College|| GEOD|C80469_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80469_02 - Hocking Technical College|| GEOD|C80473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80473_01 - Ohio University|| GEOD|C80473_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80473_02 - Ohio University|| GEOD|C80503_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80503_01 - Bournemouth_University|| GEOD|C80504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80504_01 - Bradford_College|| GEOD|C80505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80505_01 - British_Film_Institute|| GEOD|C80529_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80529_01 - East_Berkshire_College|| GEOD|C80532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80532_01 - EUI|| GEOD|C80541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80541_01 - Greenwich_Community_College|| GEOD|C80559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80559_01 - London_South_Bank_University|| GEOD|C80593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80593_01 - South_Thames_College|| GEOD|C80606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80606_01 - Wakefield_College|| GEOD|C80610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80610_01 - York_College|| GEOD|C80674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80674_01 - Rowan University, Glassboro, NJ|| GEOD|C80774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C80774_01 - College de Rosemont|| GEOD|C81189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81189_01 - University of Saskatchewan|| GEOD|C81216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81216_01 - Knowledge Universe Education LLC|| GEOD|C81228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81228_01 - Service régional d'admission du Mtl. Métropolitan|| GEOD|C81239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81239_01 - GUILFORD YOUNG COLLEGE|| GEOD|C81287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81287_01 - Academy,Ltd.|| GEOD|C81318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81318_01 - NewBrunswickCommunityCollege|| GEOD|C81399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81399_01 - Bureau de cooperation interuniversitaire - BCI|| GEOD|C81489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81489_01 - Université Bishop's|| GEOD|C81490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81490_01 - ecole Polytechnique de Montreal|| GEOD|C81495_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81495_01 - CAN/QC - Universite Concordia|| GEOD|C81513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81513_01 - NAIT|| GEOD|C30115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30115_01 - ENPQ - École Nationale de Police du Québec|| GEOD|C30144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30144_01 - Indianapolis Public Schools District|| GEOD|C30219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30219_01 - Northwestern University|| GEOD|C31710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31710_01 - Blokeret - Århus Købmandsskole - - stop - brug 57773|| GEOD|C31778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31778_01 - Undervisningsministeriet|| GEOD|C60173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60173_01 - ASOCIACION IBEROTEC|| GEOD|C60241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60241_01 - Boverket|| GEOD|C60271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60271_01 - Education|| GEOD|C60283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60283_01 - Borlange Kommun|| GEOD|C60285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60285_01 - Botkyrka kommun|| GEOD|C60291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60291_01 - Jonkopings Kommun|| GEOD|C60293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60293_01 - Kiruna kommun|| GEOD|C60297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60297_01 - Lunds Kommun|| GEOD|C60299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60299_01 - Nacka Kommun|| GEOD|C60302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60302_01 - Skelleftea kommun|| GEOD|C60306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60306_01 - Sodertalje Kommun|| GEOD|C60308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60308_01 - Uppsala Kommun|| GEOD|C70557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C70557_01 - Centro Español Intermedio de Capacitación|| GEOD|C70565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C70565_01 - Fundación de Capacitación Sofofa|| GEOD|C81035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81035_01 - EASTMAN DENTAL INSTITUTE|| GEOD|C81161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81161_01 - University of Victoria|| GEOD|C81246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81246_01 - Conseil des écoles catholiques du Centre-Est|| GEOD|C30916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30916_01 - Radford University|| GEOD|C30940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30940_01 - Centre musical l'Accroche Notes|| GEOD|C30956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30956_01 - Dalhousie University|| GEOD|C30976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30976_01 - Grance école de commerce en de management (Ceram)|| GEOD|C30995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30995_01 - Brownsville Independent School District|| GEOD|C31163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31163_01 - Southern Methodist University|| GEOD|C31287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31287_01 - Sheridan College Institute of Tech & Adv Learning|| GEOD|C31435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31435_01 - Goteborgs Universitet|| GEOD|C30219_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30219_02 - Northwestern University|| GEOD|C30219_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30219_03 - Northwestern University|| GEOD|C30235_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30235_02 - Oakland Public Schools|| GEOD|C30278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30278_01 - Salem-Kaiser School District|| GEOD|C30348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30348_01 - ASU, AZ|| GEOD|C30001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30001_01 - AACTI|| GEOD|C30801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30801_01 - Grant MacEwan College|| GEOD|C30825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30825_01 - Royal Roads University|| GEOD|C30865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30865_01 - Cégep de Ste-Foy|| GEOD|C30372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30372_01 - Association Diplomes de Polytechnique|| GEOD|C30374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30374_01 - CFORP|| GEOD|C30375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30375_01 - Cegep@distance|| GEOD|C30383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30383_01 - Fondation de Polytechnique|| GEOD|C30386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30386_01 - Metropolitain Nashville Public Schools|| GEOD|C30393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30393_01 - Red Deer College|| GEOD|C30398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30398_01 - Universite de Sherbrooke|| GEOD|C30398_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30398_02 - Universite de Sherbrooke|| GEOD|C30400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30400_01 - Universite Moncton (Campus d'Edmunston)|| GEOD|C30599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30599_01 - University of New Brunswick|| GEOD|C30600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30600_01 - Workplace Health, Safety and Compensation|| GEOD|C30637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30637_01 - ASCII|| GEOD|C30686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30686_01 - Indian Residential Schools Resolutions|| GEOD|C30726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C30726_01 - Arizona Sate University|| GEOD|C60246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C60246_01 - KAMK|| GEOD|C81128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81128_01 - Pearson Platforms|| GEOD|C10488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C10488_01 - UDM - Universite de Montreal (Registrariat)|| GEOD|C10565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C10565_01 - CGA - Ordre des comptables generaux accredites du Quebec|| GEOD|C10091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C10091_01 - CAN - School of Public Service (CSPS)|| GEOD|C22278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C22278_01 - OCU Colombia|| GEOD|C81585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81585_01 - NSERC|| GEOD|C81605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81605_01 - Cree School Board|| GEOD|C81608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81608_01 - ENAP - École nationale d'administration publique|| GEOD|C81609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81609_01 - ENAP - École nationale d'administration publique|| GEOD|C81655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81655_01 - Roskilde Universitetscenter|| GEOD|C81688_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81688_01 - C81688_01 - SUNION Educaci���n Integral S.A.|| GEOD|C81816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81816_01 - DUO Groningen|| GEOD|C81819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81819_01 - Ministry OC&W|| GEOD|C31191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C31191_01 - Athabasca University|| GEOD|C81981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C81981_01 - University of Alberta|| GEOD|C82006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82006_01 - Department for Education & Child Develop|| GEOD|C82038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82038_01 - Universit�deMontr�al|| GEOD|C82116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82116_01 - Stockholms universitet|| GEOD|C82121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82121_01 - Universitetskanslers�mbetet (UK�)|| GEOD|C82357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82357_01 - DEPT OF EDUCATION, TRAINING & EMPLOYMENT|| GEOD|C82559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82559_01 - NT Department of Education|| GEOD|C82595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82595_01 - University of Nevada|| GEOD|C82597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82597_01 - Fresno Unified School Dist|| GEOD|C82632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82632_01 - Yonkers Public Schools|| GEOD|C82706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82706_01 - Savannah Public Schools|| GEOD|C82722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82722_01 - Philidelphia School District|| GEOD|C82837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82837_01 - INTEGRABLE|| GEOD|C82878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82878_01 - Upper Canada District School Board|| GEOD|C82981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C82981_01 - University of Washington|| GEOD|C83023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83023_01 - Upper Canada District School Board|| GEOD|C83109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83109_01 - College Lasalle|| GEOD|C83141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83141_01 - Centre Universitaire de Sant? MHWGll|| GEOD|C83146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83146_01 - George Brown College|| GEOD|C83181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83181_01 - ACADEMY OF DESIGN AUSTRALIA PTY LTD|| GEOD|C83169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83169_01 - Lunds Universitet|| GEOD|C83180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83180_01 - TAS TAFE|| GEOD|C83194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83194_01 - Sametinget|| GEOD|C83221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83221_01 - UQAM|| GEOD|C83264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83264_01 - MI - Oakland Schools|| GEOD|C83348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83348_01 - BEACON FOUNDATION|| GEOD|C83404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83404_01 - LCI Education|| GEOD|C83448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83448_01 - Queen's University|| GEOD|C83523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83523_01 - Northcentral Technical College|| GEOD|C83524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83524_01 - Northeastern University|| GEOD|C83529_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83529_01 - Shorelight Educattion|| GEOD|C83538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83538_01 - Thomas College|| GEOD|C83561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83561_01 - Department of Education|| GEOD|C83628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83628_01 - Commission scolaire de Laval|| GEOD|C83655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83655_01 - Baltimore County Public Schools|| GEOD|C83706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83706_01 - Northern Alberta Institute of Technology|| GEOD|C83730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83730_01 - ANNE ARUNDEL COUNTY PUBLIC SCHOOLS|| GEOD|C83749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83749_01 - Baltimore County Public Schools|| GEOD|C83928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83928_01 - IOWA STATE UNIVERSITY|| GEOD|C83978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C83978_01 - Missouri State|| GEOD|C84041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84041_01 - PRINCE WILLIAM COUNTY PUBLIC SCHOOLS|| GEOD|C84069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84069_01 - Savannah Public Schools|| GEOD|C84077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84077_01 - SMU|| GEOD|C84139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84139_01 - UNIV OF MED/DENTIST NJ|| GEOD|C84166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84166_01 - William Marsh Rice University|| GEOD|C84185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84185_01 - Baltimore County Public Schools|| GEOD|C84208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84208_01 - CA - Los Angeles County Office of Education|| GEOD|C84230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84230_01 - Cornell|| GEOD|C84262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GEOD_Att|C84262_01 - University of Alabama Birmingham|| Central_and_Federal|GFHR|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GFHR|C11109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C11109_01 - BIS (Fujitsu Services)|| GFHR|C11121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C11121_01 - Ex-Pats|| GFHR|C11124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C11124_01 - Government Payrolls|| GFHR|C11125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C11125_01 - H.M. Treasury|| GFHR|C11157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C11157_01 - Scottish Government|| GFHR|C11160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C11160_01 - Skills Funding Agency|| GFHR|C30056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30056_01 - Citizenship and Immigration Canada|| GFHR|C30116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30116_01 - Elections Canada|| GFHR|C30551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30551_01 - Housing and Urban Development ERP|| GFHR|C30551_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30551_02 - Housing and Urban Development - NON ERP|| GFHR|C30551_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30551_03 - NuCore HUD|| GFHR|C30554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30554_01 - Library of Congress|| GFHR|C30555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30555_01 - Misc - Product License and Maintenance|| GFHR|C30578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30578_01 - National Business Center - NLRB|| GFHR|C30578_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30578_02 - CNCS - Corporation for National and Community Services|| GFHR|C30595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30595_01 - Centrelink|| GFHR|C30624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30624_01 - ANCSEC|| GFHR|C30685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30685_01 - Communications Security Establishment|| GFHR|C30720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30720_01 - Tennessee Housing Development Angency|| GFHR|C30775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30775_01 - Michigan State Housing Development Authority|| GFHR|C30776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30776_01 - Telefilm Canada|| GFHR|C30861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30861_01 - Tampa Florida Housing Authority|| GFHR|C30239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30239_01 - Office of the Commissioner of Review|| GFHR|C30402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30402_01 - AHSC - Ohio|| GFHR|C30403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30403_01 - NY HTFC|| GFHR|C30404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30404_01 - CAHI - California Affordable Housing Initiative|| GFHR|C30405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30405_01 - NTHDC|| GFHR|C30406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30406_01 - AHSC - Washington DC|| GFHR|C30407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30407_01 - Employment Connection|| GFHR|C30411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30411_01 - Oakland Housing Authority|| GFHR|C30414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30414_01 - Fonds d'action et de soutien|| GFHR|C30539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30539_01 - Planning portal|| GFHR|C31398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31398_01 - Direccao Geral Pescas Agricultura|| GFHR|C31407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31407_01 - Ekonomistyrningsverket|| GFHR|C31424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31424_01 - Forsakringskassan|| GFHR|C31428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31428_01 - GAIN|| GFHR|C31436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_01 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_02 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_03 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_04 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_05 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_06 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_07 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_09 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_11 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31436_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_12 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C31440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31440_01 - Helsingborgs Stad|| GFHR|C31446_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31446_01 - HMG1|| GFHR|C31447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31447_01 - HMG11|| GFHR|C31448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31448_01 - HMG2|| GFHR|C31449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31449_01 - HMG3|| GFHR|C31450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31450_01 - HMG5|| GFHR|C31451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31451_01 - HMG6|| GFHR|C31452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31452_01 - HMG8|| GFHR|C31454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31454_01 - Home Office|| GFHR|C31467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31467_01 - Karlstads Kommun|| GFHR|C31491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31491_01 - Logica Fælles kunde / Erfa gruppe|| GFHR|C31492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31492_01 - Logica intern kunde|| GFHR|C31509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31509_01 - MINISTERE DE L'INTERIEUR|| GFHR|C31509_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31509_02 - MINISTERE DE L'INTERIEUR|| GFHR|C31509_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31509_03 - MINISTERE DE L'INTERIEUR|| GFHR|C31509_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31509_04 - MINISTERE DE L'INTERIEUR|| GFHR|C31509_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31509_05 - MINISTERE DE L'INTERIEUR|| GFHR|C31509_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31509_06 - MINISTERE DE L'INTERIEUR|| GFHR|C31509_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31509_09 - MINISTERE DE L'INTERIEUR|| GFHR|C31529_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31529_01 - Ministry of employment and the economy|| GFHR|C31556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31556_01 - O.G.C.|| GFHR|C31559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31559_01 - OFSTED|| GFHR|C30941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30941_01 - Chambre des communes du Canada|| GFHR|C30947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30947_01 - Immigration and Refugee Board of Canada|| GFHR|C30971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30971_01 - Department of Human Services|| GFHR|C30994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30994_01 - Human Resources and Skills Development Canada|| GFHR|C30998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30998_01 - House of Commons|| GFHR|C31009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31009_01 - ECM Accounts|| GFHR|C31020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31020_01 - Library and Archives Canada|| GFHR|C31030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31030_01 - NYS Housing Trust Fund Corp.|| GFHR|C31030_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31030_02 - NYS Housing Trust Fund Corp.|| GFHR|C31030_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31030_03 - BC Lottery Corporation|| GFHR|C31033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31033_01 - Social Security Administration|| GFHR|C31058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31058_01 - Financial Consumer Agency of Canada|| GFHR|C31064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31064_01 - MAHMA - Midwest Affordable Housing Management Association|| GFHR|C31068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31068_01 - BBG - Broadcasting Board of Governors|| GFHR|C31084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31084_01 - Other Civilian Agencies|| GFHR|C31084_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31084_02 - Other Civilian Agencies|| GFHR|C31084_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31084_03 - Other Civilian Agencies|| GFHR|C31084_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31084_04 - Other Civilian Agencies|| GFHR|C31084_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31084_05 - Other Civilian Agencies|| GFHR|C31084_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31084_06 - Other Civilian Agencies|| GFHR|C31084_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31084_07 - Other Civilian Agencies|| GFHR|C31093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31093_01 - Commercial|| GFHR|C31111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31111_01 - NTHDC - Florida PBCA|| GFHR|C31112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31112_01 - Housing Consulting|| GFHR|C31113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31113_01 - Housing IT|| GFHR|C31114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31114_01 - Workforce Development|| GFHR|C31132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31132_01 - The National Gallery of Canada|| GFHR|C31140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31140_01 - Thomas and Herbert Consulting|| GFHR|C31142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31142_01 - Social Science and Humanities Research Council|| GFHR|C31161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31161_01 - NRC - Nuclear Regulatory Commission|| GFHR|C31179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31179_01 - Canadian Standards Association|| GFHR|C31211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31211_01 - Department of Labor Program Solutions|| GFHR|C31220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31220_01 - Indirect|| GFHR|C31220_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31220_02 - Indirect|| GFHR|C31220_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31220_03 - Indirect|| GFHR|C31220_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31220_04 - Indirect|| GFHR|C31220_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31220_05 - Indirect|| GFHR|C31220_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31220_06 - Indirect|| GFHR|C31220_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31220_07 - Indirect|| GFHR|C31222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31222_01 - Restricted Clients|| GFHR|C31222_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31222_02 - Restricted Clients|| GFHR|C31222_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31222_03 - Restricted Clients|| GFHR|C31222_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31222_04 - Restricted Clients|| GFHR|C31222_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31222_05 - Restricted Clients|| GFHR|C31222_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31222_06 - Restricted Clients|| GFHR|C31222_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31222_07 - Restricted Clients|| GFHR|C31227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31227_01 - Association in Defence of the Wrongly Convicted|| GFHR|C31248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31248_01 - Atomic Energy of Canada|| GFHR|C31261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31261_01 - Smithsonian|| GFHR|C31265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31265_01 - General Insurance Statistical Agency|| GFHR|C31265_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31265_02 - General Insurance Statistical Agency|| GFHR|C31277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31277_01 - Department of Immigration and Citizenship|| GFHR|C31295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31295_01 - ATSSC|| GFHR|C31340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31340_01 - Big_Lottery_Fund|| GFHR|C31350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31350_01 - Bundesanstalt fur Landwirtschaft und Ernahrung|| GFHR|C31351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31351_01 - Bundesanstalt fur Wasserbau|| GFHR|C31353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31353_01 - Bundesministerium des Innern|| GFHR|C31354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31354_01 - Bundesministerium fur Finanzen|| GFHR|C31371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31371_01 - Cronos|| GFHR|C31374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31374_01 - CSC Computer Sciences Ltd|| GFHR|C31582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31582_01 - Pensionsmyndigheten|| GFHR|C31596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_01 - REGIONS GOVERNMENT|| GFHR|C31596_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_02 - REGIONS GOVERNMENT|| GFHR|C31596_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_03 - REGIONS GOVERNMENT|| GFHR|C31596_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_04 - REGIONS GOVERNMENT|| GFHR|C31596_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_05 - REGIONS GOVERNMENT|| GFHR|C31596_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_06 - REGIONS GOVERNMENT|| GFHR|C31596_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_09 - REGIONS GOVERNMENT|| GFHR|C31596_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_11 - REGIONS GOVERNMENT|| GFHR|C31596_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31596_12 - REGIONS GOVERNMENT|| GFHR|C31604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31604_01 - Samhall Koncernen|| GFHR|C31621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31621_01 - Skills Funding Agency|| GFHR|C31630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31630_01 - SPV|| GFHR|C31631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31631_01 - Statens Institutionsstyrelse|| GFHR|C31681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31681_01 - Other WIT & Patents|| GFHR|C31689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31689_01 - Superintendencia de Casinos de Juego|| GFHR|C31696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31696_01 - Logica Luxembourg|| GFHR|C31697_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31697_01 - Logica France|| GFHR|C31718_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31718_01 - Det Kongelige Teater|| GFHR|C31732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31732_01 - Føroya Gjaldstova|| GFHR|C31739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31739_01 - Indenrigs- og Socialministeriet|| GFHR|C31743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31743_01 - Kirkeministeriet - IT-Kontoret|| GFHR|C31751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31751_01 - Kulturministeriet|| GFHR|C31752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31752_01 - Landsbyggefonden|| GFHR|C31758_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31758_01 - Nordisk Ministerråd|| GFHR|C31776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31776_01 - Uddannelsesministeriets It|| GFHR|C39999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C39999_03 - Other Sub Sector GFHR|| GFHR|C39999_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C39999_08 - Other Sub Sector GFCI (old sub-sector)|| GFHR|C39999_29|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C39999_29 - Other Sub Sector GFHO (old sub-sector)|| GFHR|C51558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C51558_01 - Serco Limited|| GFHR|C51558_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C51558_02 - Serco Limited|| GFHR|C52186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C52186_01 - Ministeriet for by, bolig og landdistrikter|| GFHR|C81039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81039_01 - GROS|| GFHR|C81051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81051_01 - SCOTTISH CHILDRENS REPORTER AD|| GFHR|C81052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81052_01 - Scottish Government|| GFHR|C81055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81055_01 - Skills Funding Agency|| GFHR|C81065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81065_01 - Advanced Computer Systems SpA|| GFHR|C81090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81090_01 - EUROPEAN COMMISSION DIRECTORATE-GENERAL|| GFHR|C81137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81137_01 - Serco Limited|| GFHR|C80258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80258_01 - SciSys UK Ltd|| GFHR|C80259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80259_01 - CS Systemes D'Information|| GFHR|C80280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80280_01 - Senate|| GFHR|C80295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80295_01 - Bayrisches Landesamt für Steuern|| GFHR|C80296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80296_01 - Versorgungsanstalt des Bundes|| GFHR|C80359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80359_01 - hammerer-system-messtechnik|| GFHR|C80365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80365_01 - DEFRA|| GFHR|C80488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80488_01 - INA - Direção-Geral da Qualificação|| GFHR|C80502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80502_01 - Big_Lottery_Fund|| GFHR|C80516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80516_01 - Charity_Commission|| GFHR|C80526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80526_01 - Dept_Culture_Media_&_Sport|| GFHR|C80567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80567_01 - National_Archives|| GFHR|C80569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80569_01 - National_Gallery|| GFHR|C80603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80603_01 - Victoria_&_Albert_Museum|| GFHR|C80781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80781_01 - CAN/QC - Ministere de la Famille|| GFHR|C81238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81238_01 - Ministerio de Educación Cultura y Deporte|| GFHR|C81258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81258_01 - Direccion de Trabajo|| GFHR|C80964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80964_01 - Pension Protection Fund|| GFHR|C21930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C21930_01 - U.S. Railroad Retirement Board|| GFHR|C81543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81543_01 - CAISSE NAL SOLIDARITE AUTONOMIE|| GFHR|C60244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60244_01 - Ekonomistyrningsverket|| GFHR|C60245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60245_01 - Forsakringskassan|| GFHR|C60252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60252_01 - Pensionsmyndigheten|| GFHR|C60280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60280_01 - Statens Institutionsstyrelse|| GFHR|C60289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60289_01 - Helsingborgs Stad|| GFHR|C60292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60292_01 - Karlstads Kommun|| GFHR|C80621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80621_01 - DEFRA|| GFHR|C80626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80626_01 - HMG8|| GFHR|C80848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80848_01 - Planning Portal|| GFHR|C81079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81079_01 - CS Systemes D'Information|| GFHR|C30890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30890_01 - Centre d'orientation et recherche d'emploi - Estrie|| GFHR|C30911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30911_01 - AHSC - Assisted Housing Services Corporation|| GFHR|C30942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30942_01 - CCDP - Commission canadienne des droits de la personne|| GFHR|C30964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30964_01 - IRCEM - Institution de retraite compl. des emp. de particuliers|| GFHR|C30972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30972_01 - Charleston-Kanawha Housing Authority|| GFHR|C30973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30973_01 - NYS Division of Housing|| GFHR|C30974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30974_01 - St-Mary Development Corporation|| GFHR|C30978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30978_01 - FASILD|| GFHR|C30979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30979_01 - Knoxville Community Development Corporation|| GFHR|C30990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30990_01 - Houston Housing Authority|| GFHR|C30991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30991_01 - Pennsylvania Consortium of Housing Authorities|| GFHR|C30996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30996_01 - Michigan Consortium of Housing Authorities|| GFHR|C31003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31003_01 - Cambridge Housing Authority|| GFHR|C31004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31004_01 - SSA - Social Security Administration|| GFHR|C31013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31013_01 - Chicago Housing Authority|| GFHR|C31014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31014_01 - Denver Housing Authority|| GFHR|C31015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31015_01 - Housing Authority of St. Louis Sity|| GFHR|C31016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31016_01 - Housing Authority of the City of Winston-Salem|| GFHR|C31022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31022_01 - Housing Authority of East Baton Rouge Parish|| GFHR|C31054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31054_01 - ANPE - Agence nationale pour l'emploi|| GFHR|C31147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31147_01 - Ferndale Housing Commission|| GFHR|C31171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31171_01 - San Antonio Housing Authority|| GFHR|C31187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31187_01 - MedinaWorks|| GFHR|C31187_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31187_02 - MedinaWorks|| GFHR|C31194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31194_01 - Homeless Coalition of Hillsborough County|| GFHR|C31269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31269_01 - Emphasys|| GFHR|C31270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31270_01 - Metro Inspection LLC|| GFHR|C31274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31274_01 - Central Ohio Workforce Investment Corporation|| GFHR|C20525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C20525_01 - Soutien aux operations|| GFHR|C20526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C20526_01 - Soutien aux reseaux|| GFHR|C30787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30787_01 - Housing Authority of the city of Los Angeles|| GFHR|C30814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30814_01 - Housing Authority of the County of Alameda|| GFHR|C30819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30819_01 - Albany - Housing Authority|| GFHR|C30560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30560_01 - Housing Authority City of Pittsburgh|| GFHR|C30606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30606_01 - Tampa Housing Authority|| GFHR|C30619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30619_01 - Washington DC|| GFHR|C30651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30651_01 - Fondation Canadienne des Bourses du Millénaire|| GFHR|C30695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30695_01 - Akron - Metro Housing Authority|| GFHR|C30698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30698_01 - District of Columbia Housing Authority|| GFHR|C30699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30699_01 - Lake Metropolitan Housing Authority|| GFHR|C30701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30701_01 - MAHMA|| GFHR|C30703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30703_01 - Housing Authority of Bridgeport|| GFHR|C30705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30705_01 - HA County of San Buenaventure|| GFHR|C30706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30706_01 - HA of City of El Paso|| GFHR|C30707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30707_01 - HACSC|| GFHR|C30708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30708_01 - Harrisburg Housing Authority|| GFHR|C30710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30710_01 - Norwalk Housing Authority|| GFHR|C30712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30712_01 - Petersburg Redevelopment and Housing|| GFHR|C30713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30713_01 - Rocky AHMA|| GFHR|C30715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30715_01 - South Dakota Housing Development Authority|| GFHR|C80700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C80700_01 - Advanced Computer Systems SpA|| GFHR|C81032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81032_01 - CITIZENS ADVICE|| GFHR|C81135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81135_01 - SciSys UK Ltd|| GFHR|C60262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60262_01 - SPV|| GFHR|C60255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C60255_01 - Samhall Koncernen|| GFHR|C31092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31092_01 - Space/Naval Warfare Systems Command (SPAWAR)|| GFHR|C81551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81551_01 - CAN/QC - Commission de la santé et sécurité|| GFHR|C81566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81566_01 - CAN/QC - Régie du bâtiment du Québec|| GFHR|C81571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81571_01 - Visa Support|| GFHR|C81572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81572_01 - La Marocaine des Jeux et des Sports (MDJS)|| GFHR|C81584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81584_01 - SSHRC|| GFHR|C81705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81705_01 - C81705_01 - The Skills Development Scotland Co Limit|| GFHR|C81691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81691_01 - C81691_01 - GSA/Office of Citizen Srvs and Innovative Tech|| GFHR|C81708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81708_01 - Shared Services Canada - Professional Services|| GFHR|C81709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81709_01 - C81709_01 - Social Security Tribunal|| GFHR|C81752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81752_01 - TEKNA-TEKNISK-NATURVITENSKAPELIG|| GFHR|C30560_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C30560_02 - Housing Authority of the City of Newark|| GFHR|C81813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81813_01 - Pdirekt|| GFHR|C81837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81837_01 - IND|| GFHR|C81848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81848_01 - MUSEE CAN.CIVIL.|| GFHR|C81993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C81993_01 - Canadian Museum of Civilization Corporation|| GFHR|C82126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82126_01 - Statens Fastighetsverk|| GFHR|C82275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82275_01 - Unionen|| GFHR|C82352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82352_01 - DEPARTMENT OF SOCIAL SERVICES|| GFHR|C82390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82390_01 - WSIB|| GFHR|C82393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82393_01 - Employment and Social Development Canada|| GFHR|C82430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82430_01 - Natural History Museum|| GFHR|C82509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82509_01 - SZW|| GFHR|C82947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C82947_01 - Periscope Holdings, Inc.|| GFHR|C83005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83005_01 - Commerce/Census Bureau|| GFHR|C83013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83013_01 - NIST|| GFHR|C83021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83021_01 - Administrative Tribunal Support Service|| GFHR|C83185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83185_01 - NJ - State of New Jersey|| GFHR|C83184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83184_01 - NY - State of New York|| GFHR|C83378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83378_01 - Multiclient - Local Payroll|| GFHR|C83379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83379_01 - MULTICLIENT - Scotland|| GFHR|C83382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83382_01 - Astrup Fearnley|| GFHR|C31436_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C31436_13 - GOVERNMENT - EMPLOYMENT - SOCIAL - HEALTH|| GFHR|C83440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83440_01 - REGIONS GOVERNMENT|| GFHR|C83667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83667_01 - NJ Dept. of Children and Families|| GFHR|C83700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C83700_01 - St of Minnesota Dept of Human Services|| GFHR|C84228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFHR_Att|C84228_01 - CA - San Diego Housing Commission|| Government|Provincial_and_Municipal|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Provincial and Municipal|| Provincial_and_Municipal|GPAD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GPAD|C11137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C11137_01 - Land Registry|| GPAD|C30002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30002_01 - AB Seniors and Community Supports|| GPAD|C30009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30009_01 - AK - Department of health and social services|| GPAD|C30009_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30009_02 - AK - Department of health and social services|| GPAD|C30010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30010_01 - State of Alabama|| GPAD|C30010_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30010_02 - State of Alabama|| GPAD|C30011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30011_01 - AK - Department of Administration (Finance)|| GPAD|C30011_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30011_02 - AK - Department of Administration (Finance)|| GPAD|C30013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30013_01 - Alberta - Agriculture|| GPAD|C30014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30014_01 - Alberta - Children's services|| GPAD|C30015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30015_01 - Alberta - Tourism, Parks, Rec and Culture|| GPAD|C30017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30017_01 - Alberta - Energy|| GPAD|C30018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30018_01 - Alberta - Government Services|| GPAD|C30019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30019_01 - Alberta Human Services|| GPAD|C30021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30021_01 - Alberta - Justice|| GPAD|C30022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30022_01 - Alberta - Labour Relations Board|| GPAD|C30024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30024_01 - Alberta - Finance and Enterprise|| GPAD|C30025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30025_01 - Alberta - Sustainable Resource Development|| GPAD|C30031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30031_01 - BC - Housing|| GPAD|C30033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30033_01 - Bibliotheque et archives nationales du Quebec|| GPAD|C30033_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30033_02 - Bibliothèque et archives nationales du Québec|| GPAD|C30037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30037_01 - CA - Dept of parks and recs|| GPAD|C30037_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30037_02 - CA - Dept of parks and recs|| GPAD|C30038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30038_01 - CA - Health and Human Services Agency|| GPAD|C30038_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30038_02 - CA - Health and Human Services Agency|| GPAD|C30043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30043_01 - Carra|| GPAD|C30043_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30043_02 - Carra|| GPAD|C30050_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30050_03 - CSPQ - Centre de services partages du Quebec|| GPAD|C30050_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30050_04 - CSPQ - Centre de services partagés du Québec|| GPAD|C30050_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30050_05 - CSPQ - Centre de services partagés du Québec|| GPAD|C30051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30051_01 - Centre jeunesse de Quebec|| GPAD|C30082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30082_01 - Commission des normes du travail|| GPAD|C30082_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30082_02 - Commission des normes du travail|| GPAD|C30085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30085_01 - Conseil du tresor|| GPAD|C30085_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30085_02 - Conseil du tresor|| GPAD|C30085_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30085_03 - Conseil du trésor|| GPAD|C30086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30086_01 - Conseil exécutif|| GPAD|C30086_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30086_02 - Conseil exécutif|| GPAD|C30089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30089_01 - CSST|| GPAD|C30089_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30089_02 - CSST|| GPAD|C30089_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30089_03 - CSST|| GPAD|C30089_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30089_04 - CSST|| GPAD|C30102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30102_01 - Division of Wildlife|| GPAD|C30121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30121_01 - ENV - S and L - MS DEQ|| GPAD|C30122_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30122_03 - ENV - S and L - NJ DEP|| GPAD|C30133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30133_01 - Government North West Territories|| GPAD|C30135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30135_01 - Government of Northwest Territories|| GPAD|C30135_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30135_02 - Government of Northwest Territories|| GPAD|C30135_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30135_03 - Government of Northwest Territories|| GPAD|C30140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30140_01 - IN Department of Environmental Management|| GPAD|C30140_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30140_02 - IN Department of Environmental Management|| GPAD|C30140_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30140_03 - IN Department of Environmental Management|| GPAD|C30146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30146_01 - Industry Training Authority|| GPAD|C30147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30147_01 - Information Technology Office|| GPAD|C30147_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30147_02 - Information Technology Office (SK Justice)|| GPAD|C30155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30155_01 - Kronos|| GPAD|C30157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30157_01 - La Financiere agricole du Quebec|| GPAD|C30157_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30157_02 - La Financiere agricole du Quebec|| GPAD|C30160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30160_01 - Le Protecteur du Citoyen|| GPAD|C30163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30163_01 - Loto-Quebec|| GPAD|C30163_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30163_02 - Loto-Quebec|| GPAD|C30558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30558_01 - NS Dept of Community Services|| GPAD|C30563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30563_01 - SNB|| GPAD|C30568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30568_01 - NS Dept of Finance|| GPAD|C30575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30575_01 - BC - Ministry of Forests|| GPAD|C30576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30576_01 - Kentucky Finance and Administration Cabinet|| GPAD|C30576_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30576_02 - Kentucky Finance and Administration Cabinet|| GPAD|C30577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30577_01 - Adv Maintenance (all clients)|| GPAD|C30585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30585_01 - North Carolina State|| GPAD|C30590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30590_01 - NB Dept of Family and Community Service|| GPAD|C30596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30596_01 - State of Ohio|| GPAD|C30597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30597_01 - Department of Public Safety|| GPAD|C30601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30601_01 - Workers' Compensation Board of NS|| GPAD|C30602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30602_01 - Dept of Social Development (NB)|| GPAD|C30610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30610_01 - VA Department of General Services|| GPAD|C30610_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30610_02 - VA Department of General Services|| GPAD|C30611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30611_01 - Commonwealth of Kentucky|| GPAD|C30611_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30611_02 - Commonwealth of Kentucky|| GPAD|C30612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30612_01 - Ewisacwis|| GPAD|C30613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30613_01 - OH Department of Taxation|| GPAD|C30638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30638_01 - Assemblée nationale|| GPAD|C30640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30640_01 - Bureau d'audience publique sur l'environnement|| GPAD|C30642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30642_01 - Commissaire au lobbyisme du Québec|| GPAD|C30643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30643_01 - Commission d'appel en matière de lésions|| GPAD|C30645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30645_01 - Commission de protection du territoire agricole du Québec|| GPAD|C30646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30646_01 - Commission des valeurs mobilières|| GPAD|C30646_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30646_02 - Commission des valeurs mobilieres|| GPAD|C30647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30647_01 - Curateur publique|| GPAD|C30647_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30647_02 - Curateur public du Quebec|| GPAD|C30648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30648_01 - Directeur général des élections|| GPAD|C30648_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30648_02 - Directeur général des élections|| GPAD|C30654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30654_01 - GIRES - dir du SAGIP|| GPAD|C30656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30656_01 - Institut de la statistique du Québec|| GPAD|C30656_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30656_02 - Institut de la statistique du Québec|| GPAD|C30657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30657_01 - Institut de tourisme et de l'hôtellerie du Québec|| GPAD|C30659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30659_01 - Ministère de l'Immigration et des|| GPAD|C30659_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30659_02 - Ministère de l'Immigration, Diversité et Inclusion (MIDI)|| GPAD|C30662_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30662_01 - Ministère de la sécurité publique|| GPAD|C30663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30663_01 - Ministère de l'agriculture et de l'alimentation|| GPAD|C30664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30664_01 - Ministère de l'environnement et de la faune|| GPAD|C30665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30665_01 - Ministère des affaires internationales|| GPAD|C30666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30666_01 - Ministère des affaires municipales|| GPAD|C30666_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30666_02 - CAN/QC-Min. Aff. munic., Régions et Occup. terr.|| GPAD|C30669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30669_01 - Office de la langue française|| GPAD|C30671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30671_01 - Protecteur du citoyen|| GPAD|C30673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30673_01 - Régie du logement|| GPAD|C30673_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30673_02 - Regie du logement|| GPAD|C30674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30674_01 - Registraire des entreprises|| GPAD|C30677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30677_01 - Sûreté du Québec|| GPAD|C30677_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30677_02 - Surete du Quebec|| GPAD|C30677_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30677_03 - Sûreté du Québec|| GPAD|C30678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30678_01 - Vérificateur Général du Québec|| GPAD|C30692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30692_01 - FL Dept of Children and families|| GPAD|C30725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30725_01 - Arizona - Dept of Economic Sec|| GPAD|C30735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30735_01 - Commonwealth of Massachusetts|| GPAD|C30735_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30735_02 - Commonwealth of Massachusetts|| GPAD|C30740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30740_01 - Illinois Department of Employment Security|| GPAD|C30746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30746_01 - State of Louisiana|| GPAD|C30746_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30746_02 - State of Louisiana|| GPAD|C30747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30747_01 - State of Minnesota|| GPAD|C30747_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30747_02 - State of Minnesota|| GPAD|C30748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30748_01 - State of Missouri|| GPAD|C30748_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30748_02 - State of Missouri|| GPAD|C30756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30756_01 - Iowa Department of Revenue|| GPAD|C30756_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30756_02 - Iowa Department of Revenue|| GPAD|C30758_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30758_01 - Maryland Department of the Environment|| GPAD|C30758_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30758_02 - MD - State of Maryland|| GPAD|C30758_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30758_03 - Maryland Department of the Environment|| GPAD|C30758_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30758_04 - MD - State of Maryland|| GPAD|C30758_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30758_05 - MD - State of Maryland|| GPAD|C30762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30762_01 - State Corporation Commission|| GPAD|C30762_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30762_02 - State Corporation Commission|| GPAD|C30766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30766_01 - Allerdale Borough Council|| GPAD|C30767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30767_01 - Barrow Borough Council|| GPAD|C30768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30768_01 - Cumbria County Council|| GPAD|C30769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30769_01 - Eden District Council|| GPAD|C30771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30771_01 - Stafford ICT|| GPAD|C30772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30772_01 - Wear Valley District Council|| GPAD|C30773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30773_01 - Department of Labour and Workforce Development (NS)|| GPAD|C30779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30779_01 - VA Dept of Taxation|| GPAD|C30779_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30779_02 - VA Dept of Taxation|| GPAD|C30780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30780_01 - Government of Manitoba|| GPAD|C30781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30781_01 - Saskatchewan Information Technology Office|| GPAD|C30785_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30785_02 - Épargne Placements Québec|| GPAD|C30785_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30785_03 - Épargne Placements Québec|| GPAD|C30785_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30785_04 - Épargne Placements Québec|| GPAD|C30786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30786_01 - Mississippi Department of Finance and Administration|| GPAD|C30789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30789_01 - BC - Ministry of Technology, Trade and Economic Development|| GPAD|C30790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30790_01 - Alberta - Pensions Administration|| GPAD|C30796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30796_01 - CA - Department of social services|| GPAD|C30796_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30796_02 - CA - Department of social services|| GPAD|C30797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30797_01 - OR - Oregon State Lottery|| GPAD|C30797_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30797_02 - OR - Oregon State Lottery|| GPAD|C30799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30799_01 - Manitoba Justice|| GPAD|C30802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30802_01 - Ministry of Labour and Citizens Services|| GPAD|C30806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30806_01 - NJ Department of Community Affairs|| GPAD|C30807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30807_01 - NJ Department of Environmental Protection|| GPAD|C30807_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30807_02 - NJ Department of Environmental Protection|| GPAD|C30808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30808_01 - NJ Office of Information Technology|| GPAD|C30809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30809_01 - Iowa Department of Administrative Services|| GPAD|C30810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30810_01 - VITA - Virginia Information Technologies Agency|| GPAD|C30810_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30810_02 - VITA - Virginia Information Technologies Agency|| GPAD|C30811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30811_01 - SGI Canada|| GPAD|C30811_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30811_02 - SGI Canada|| GPAD|C30815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30815_01 - WorkSafe NB|| GPAD|C30823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30823_01 - Workers' Safety and Compensation Commission of the NWT|| GPAD|C30827_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30827_02 - Idaho (State)|| GPAD|C30827_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30827_03 - Idaho (State)|| GPAD|C30834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30834_01 - RMAAQ - Régie des marchés agricoles et alimentaires du Quebec|| GPAD|C30836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30836_01 - Emploi Quebec|| GPAD|C30837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30837_01 - EDS - Electronic Data Systems|| GPAD|C30837_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30837_03 - EDS - Electronic Data Systems|| GPAD|C30837_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30837_04 - EDS - Electronic Data Systems|| GPAD|C30837_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30837_05 - EDS - Electronic Data Systems|| GPAD|C30847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30847_01 - State of Colorado|| GPAD|C30847_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30847_02 - State of Colorado|| GPAD|C30862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30862_01 - TX Dept. of Information Resources|| GPAD|C30863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30863_01 - PA Dept of Public Welfare|| GPAD|C30872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30872_01 - LA DOA OCD/DRU|| GPAD|C30873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30873_01 - North Dakota Workforce Safety and Insurance|| GPAD|C30875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30875_01 - Victorian Government|| GPAD|C30875_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30875_02 - Victorian Department of Treasury and Finance|| GPAD|C30875_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30875_03 - Victorian Department of Health|| GPAD|C30877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30877_01 - State of Massachusetts|| GPAD|C30878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30878_01 - Elections Ontario|| GPAD|C30879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30879_01 - Ontario Ministry of Government and Consumer Services|| GPAD|C30883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30883_01 - State of Arizona|| GPAD|C30883_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30883_02 - State of Arizona|| GPAD|C30893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30893_01 - NC Dept of Revenue|| GPAD|C30893_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30893_02 - NC Dept of Revenue|| GPAD|C30893_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30893_03 - NC Dept of Revenue|| GPAD|C30895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30895_01 - Chief Information Office (NS)|| GPAD|C30899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30899_01 - Ministry of Corrections, Public Safety and Policing|| GPAD|C30905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30905_01 - Centre Jeunesse du Saguenay-Lac-St-Jean|| GPAD|C30906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30906_01 - WA Dept of Social and Health Services|| GPAD|C30906_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30906_02 - WA Dept of Social and Health Services|| GPAD|C30910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30910_01 - Saskatchewan Gaming Corporation|| GPAD|C30163_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30163_03 - Loto-Québec|| GPAD|C30165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30165_01 - State of Maine|| GPAD|C30165_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30165_03 - Maine (State)|| GPAD|C30167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30167_01 - MCC|| GPAD|C30172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30172_01 - Min des Ress. naturelles et de la Faune|| GPAD|C30174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30174_01 - Min. Agriculture, Pecheries et Aliment.|| GPAD|C30175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30175_01 - Min. de l'Emploi et Solidarite Sociale|| GPAD|C30175_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30175_02 - Min. de l'Emploi et Solidarite Sociale|| GPAD|C30176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30176_01 - MDEIE - Min. du dev. economique, Innovation|| GPAD|C30176_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30176_02 - MDEIE - Min. du dev. economique, Innovation|| GPAD|C30177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30177_01 - Min. Dev. durable, Environnement, Parcs|| GPAD|C30178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30178_01 - Ministere des Ressources naturelles|| GPAD|C30178_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30178_02 - Ministere des Ressources naturelles|| GPAD|C30179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30179_01 - Ministry of Environment|| GPAD|C30181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30181_01 - Ministry of attorney general|| GPAD|C30184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30184_01 - Ministry of Economic Development|| GPAD|C30186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30186_01 - Ministry of Finance|| GPAD|C30186_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30186_02 - Ministry of Finance|| GPAD|C30186_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30186_03 - Ministry of Finance|| GPAD|C30188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30188_01 - Ministry of Government Services|| GPAD|C30189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30189_01 - BC - Ministry of Public Safety and Solicitor|| GPAD|C30192_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30192_02 - CAN/QC - Min. Transp., Mob. durable & ��T|| GPAD|C30192_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30192_03 - Ministère des Transports du Québec (MTQ)|| GPAD|C30192_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30192_04 - Ministere des Transports du Quebec (MTQ)|| GPAD|C30193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30193_01 - Ministere de la Famille et des Aines|| GPAD|C30196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30196_01 - Ministere de la Justice du Quebec/DRC|| GPAD|C30196_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30196_02 - Ministere de la Justice du Quebec/DRC|| GPAD|C30196_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30196_03 - Ministere de la Justice du Quebec/DRC|| GPAD|C30197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30197_01 - Ministere de la securite publique|| GPAD|C30198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30198_01 - Ministere des Finances|| GPAD|C30198_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30198_02 - Ministere des Finances|| GPAD|C30198_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30198_04 - Ministere des Finances|| GPAD|C30199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30199_01 - Ministere des Services Gouvernementaux|| GPAD|C30199_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30199_02 - Ministere des Services Gouvernementaux|| GPAD|C30199_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30199_03 - Ministere des Services Gouvernementaux|| GPAD|C30201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30201_01 - Missouri - Dept of revenue|| GPAD|C30201_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30201_02 - Missouri - Dept of revenue|| GPAD|C30205_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30205_02 - MO - Dept of revenue|| GPAD|C30205_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30205_03 - CO - Dept of Revenue|| GPAD|C30212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30212_01 - Musée National des beaux-arts du Québec|| GPAD|C30216_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30216_02 - NJ - Dept of HUman Services DYFS|| GPAD|C30216_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30216_03 - NJ - Dept of HUman Services DYFS|| GPAD|C30224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30224_01 - NYS Office of Mental Health|| GPAD|C30230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30230_01 - NYS Department of Labor|| GPAD|C30231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30231_01 - NYS Dept of Environmental Conservation|| GPAD|C30233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30233_01 - NYS Office of the State Comptroller|| GPAD|C30237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30237_01 - Office des personnes handicapées|| GPAD|C30237_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30237_02 - Office des personnes handicapées|| GPAD|C30241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30241_01 - OH Dept of Public Safety|| GPAD|C30241_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30241_02 - OH Dept of Public Safety|| GPAD|C30242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30242_01 - OH Industrial Commission|| GPAD|C30244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30244_01 - OH Dept of Job Family Services|| GPAD|C30244_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30244_02 - OH Dept of Job Family Services|| GPAD|C30244_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30244_03 - OH Dept of Job Family Services|| GPAD|C30244_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30244_04 - OH Dept of Job Family Services|| GPAD|C30244_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30244_05 - OH Dept of Job Family Services|| GPAD|C30246_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30246_02 - OR Dept of Human Services|| GPAD|C30246_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30246_03 - OR Dept of Human Services|| GPAD|C30266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30266_01 - Regie de l'énergie|| GPAD|C30267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30267_01 - RIO - Regie des installations olympiques|| GPAD|C30267_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30267_02 - RIO - Regie des installations olympiques|| GPAD|C30271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30271_01 - Revenu Quebec|| GPAD|C30271_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30271_02 - Revenu Quebec|| GPAD|C30271_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30271_03 - Revenu Québec|| GPAD|C30271_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30271_04 - Revenu Quebec|| GPAD|C30276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30276_01 - RRQ - Régie des rentes du Québec|| GPAD|C30276_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30276_02 - RRQ - Régie des rentes du Québec|| GPAD|C30283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30283_01 - Saskatchewan Assessment|| GPAD|C30283_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30283_02 - SAMA - Saskatchewan Assessment Management Agency|| GPAD|C30285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30285_01 - Saskatchewan Liquor and Gaming Authority|| GPAD|C30286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30286_01 - Saskatchewan worker's|| GPAD|C30288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30288_01 - Secretariat du conseil du tresor|| GPAD|C30288_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30288_02 - Secretariat du conseil du tresor|| GPAD|C30288_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30288_03 - Secretariat du conseil du tresor|| GPAD|C30290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30290_01 - Services Quebec|| GPAD|C30294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30294_01 - SAAQ - Societe de l'assurance automobile|| GPAD|C30294_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30294_02 - SAAQ - Societe de l'assurance automobile|| GPAD|C30294_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30294_03 - SAAQ - Societe de l'assurance automobile|| GPAD|C30294_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30294_04 - SAAQ - Societe de l'assurance automobile|| GPAD|C30297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30297_01 - SAQ - Societe des Alcools du Quebec|| GPAD|C30298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30298_01 - SHQ - Societe d'habitation du Quebec|| GPAD|C30298_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30298_02 - SHQ - Societe d'habitation du Quebec|| GPAD|C30298_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30298_03 - SHQ - Societe d'habitation du Quebec|| GPAD|C30303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30303_01 - State of Indiana|| GPAD|C30303_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30303_02 - State of Indiana|| GPAD|C30304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30304_01 - State of Iowa|| GPAD|C30304_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30304_02 - State of Iowa|| GPAD|C30307_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30307_02 - State of Vermont|| GPAD|C30308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30308_01 - State of Wisconsin|| GPAD|C30308_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30308_02 - State of Wisconsin|| GPAD|C30319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30319_01 - Tribunal Administratif du Quebec|| GPAD|C30342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30342_01 - Virginia (Commonwealth of)|| GPAD|C30342_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30342_02 - Virginia (Commonwealth of)|| GPAD|C30342_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30342_03 - Virginia (Commonwealth of)|| GPAD|C30352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30352_01 - CA - Department of general services|| GPAD|C30352_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30352_02 - CA - Department of general services|| GPAD|C30353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30353_01 - CA - Franchise Tax Board|| GPAD|C30353_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30353_02 - CA - Franchise Tax Board|| GPAD|C30354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30354_01 - IBM|| GPAD|C30354_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30354_02 - IBM|| GPAD|C30354_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30354_03 - IBM|| GPAD|C30357_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30357_02 - Hawaii Department of Tax|| GPAD|C30357_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30357_03 - Hawaii Department of Tax|| GPAD|C30363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30363_01 - Wyoming State Auditor|| GPAD|C30363_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30363_02 - Wyoming State Auditor|| GPAD|C30384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30384_01 - IL Dept Healthcare and Familiy Services|| GPAD|C30415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30415_01 - Regie du pays chartrain|| GPAD|C30542_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30542_02 - California Child Support Automation System|| GPAD|C30542_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30542_03 - California Child Support Automation System|| GPAD|C30542_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30542_04 - California Child Support Automation System|| GPAD|C31441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31441_01 - Helsingin seudun liikenne -kuntayhtyma|| GPAD|C31442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31442_01 - Helsingin seudun ymparistopalvelut -kuntayhtyma|| GPAD|C31501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31501_01 - METRO FIRE & EMERGENCY SERVICES BOARD|| GPAD|C31502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31502_01 - Metropolitan Police|| GPAD|C31555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31555_01 - NSW POLICE FORCE|| GPAD|C30918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30918_01 - EDS - Electronic Data Systems|| GPAD|C30918_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30918_02 - EDS - Electronic Data Systems|| GPAD|C30920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30920_01 - Musée National des beaux-arts du Québec|| GPAD|C30934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30934_01 - R3D Conseil Inc.|| GPAD|C30935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30935_01 - Systematix|| GPAD|C30935_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30935_02 - Systematix|| GPAD|C30935_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30935_03 - Systematix|| GPAD|C30950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30950_01 - Ministere des affaires municipales, sports et loisirs|| GPAD|C30957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30957_01 - Ontario Buys|| GPAD|C30968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30968_01 - BC - Ministry of Citizens' Services|| GPAD|C30969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30969_01 - BC - Ministry of Small Business, Tech, and Eco Dev|| GPAD|C30977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30977_01 - Saskatchewan Ministry of Finance|| GPAD|C30982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30982_01 - TX Commision on Environmental Quality|| GPAD|C30984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30984_01 - KY Personnel Cabinet|| GPAD|C30987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30987_01 - Ontario Lottery and Gaming|| GPAD|C30997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30997_01 - NS Department of Environment|| GPAD|C31001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31001_01 - BC Ministry of healthy living and sport|| GPAD|C31002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31002_01 - CITEC|| GPAD|C31005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31005_01 - NYS Police|| GPAD|C31007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31007_01 - CA - Department of insurance|| GPAD|C31025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31025_01 - VA State Corporation Commission - SCC|| GPAD|C31025_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31025_02 - VA State Corporation Commission - SCC|| GPAD|C31026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31026_01 - LA - Department of Environmental Quality|| GPAD|C31026_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31026_02 - LA - Department of Environmental Quality|| GPAD|C31031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31031_01 - Atlantic Lottery Corporation|| GPAD|C31031_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31031_02 - Atlantic Lottery Corporation|| GPAD|C31031_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31031_03 - Atlantic Lottery Corporation|| GPAD|C31034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31034_01 - CALQ - Conseil des Arts et des Lettres du Québec|| GPAD|C31035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31035_01 - Alberta Land Use Secretariat|| GPAD|C31038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31038_01 - State of Alaska|| GPAD|C31038_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31038_02 - State of Alaska|| GPAD|C31046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31046_01 - NS - Department of economic and rural development|| GPAD|C31049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31049_01 - CA - Department of finance|| GPAD|C31049_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31049_02 - CA - Department of finance|| GPAD|C31051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31051_01 - MS - Department of information technology|| GPAD|C31052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31052_01 - NYS - Office General Services|| GPAD|C31056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31056_01 - Technologies Nter|| GPAD|C31056_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31056_02 - Technologies Nter|| GPAD|C31056_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31056_03 - CIA|| GPAD|C31056_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31056_04 - Technologies Nter|| GPAD|C31056_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31056_05 - Technologies Nter|| GPAD|C31061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31061_01 - LA - Department of children and family services|| GPAD|C31070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31070_01 - BC Pension Corporation|| GPAD|C31074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31074_01 - Alberta Gaming and Liquor Commission|| GPAD|C31081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31081_01 - IBM Canada|| GPAD|C31106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31106_01 - KY - Department for Environmental Protection|| GPAD|C31106_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31106_02 - KY - Department for Environmental Protection|| GPAD|C31123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31123_01 - ANQ - Assemblée nationale du Québec|| GPAD|C31124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31124_01 - BC - Ministry of Community and Rural Development|| GPAD|C31126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31126_01 - MS - Department of Environmental Quality|| GPAD|C31129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31129_01 - NV - Division of Child anf Family Services|| GPAD|C31130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31130_01 - Public Employees Benefits Agency|| GPAD|C31133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31133_01 - BC - Liquor Distribution Branch|| GPAD|C31146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31146_01 - MA Office of the Comptroller|| GPAD|C31146_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31146_02 - MA Office of the Comptroller|| GPAD|C31150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31150_01 - WY - State of Wyoming|| GPAD|C31152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31152_01 - Alberta Environment|| GPAD|C31157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31157_01 - Tecnologias de Codigo Abierto|| GPAD|C31159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31159_01 - Workers' Compensation Board - Alberta|| GPAD|C31159_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31159_02 - Workers' Compensation Board - Alberta|| GPAD|C31162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31162_01 - NYS - Office of Temporary and Disability Assistance|| GPAD|C31165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31165_01 - Community Living British Columbia|| GPAD|C31166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31166_01 - BC - Ministry of Natural Resource Operations|| GPAD|C31167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31167_01 - BC - Ministry of Jobs, Tourism and Innovation|| GPAD|C31168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31168_01 - Recyc-Québec|| GPAD|C31168_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31168_02 - Societe Quebecoise de Recuperation et de Recyclage|| GPAD|C31173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31173_01 - Ontario Securities Commission|| GPAD|C31174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31174_01 - Manitoba Public Insurance|| GPAD|C31175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31175_01 - OACIQ|| GPAD|C31175_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31175_02 - OACIQ|| GPAD|C31175_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31175_03 - Organisme d'autoréglementation du courtage immobilier du Québec|| GPAD|C31180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31180_01 - Comité Paritaire des Agents de Sécurité|| GPAD|C31181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31181_01 - Progress|| GPAD|C31185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31185_01 - BC Assessment|| GPAD|C31190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31190_01 - Nova Scotia Pension Agency|| GPAD|C31196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31196_01 - Appeals Commission for Alberta WCB|| GPAD|C31197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31197_01 - Junta de Andalucia|| GPAD|C31198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31198_01 - TX - State of Texas|| GPAD|C31223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31223_01 - Manitoba Finance Insurance and Risk Management|| GPAD|C31230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31230_01 - The Law Society of Upper Canada|| GPAD|C31232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31232_01 - STEP - Saskatchewan Trade and Export Partnership|| GPAD|C31233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31233_01 - MI - Department of Information Technology|| GPAD|C31249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31249_01 - Property Assessment Appeal Board|| GPAD|C31251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31251_01 - WV - State of West Virginia|| GPAD|C31251_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31251_02 - WV - State of West Virginia|| GPAD|C31254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31254_01 - WSIB - Workplace Safety and Insurance Board|| GPAD|C31255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31255_01 - CARE Center for Internationally Trained Nurses|| GPAD|C31256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31256_01 - MT - State of Montana|| GPAD|C31259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31259_01 - Kansas - Department of Corrections|| GPAD|C31267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31267_01 - Saskatchewan Teachers Federation|| GPAD|C31271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31271_01 - OH Bureau of Workers Comp|| GPAD|C31271_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31271_02 - OH Bureau of Workers Comp|| GPAD|C31272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31272_01 - CA - Dept of Child Support Services|| GPAD|C31279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31279_01 - NV - State of Nevada|| GPAD|C31283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31283_01 - Human Rights Tribunal of Ontario|| GPAD|C31284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31284_01 - CAN/QC-Min. de la sante et des Services sociaux|| GPAD|C31290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31290_01 - Fonds de recherche du Québec|| GPAD|C31299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31299_01 - CAN/SK - Saskatoon Police Service|| GPAD|C31300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31300_01 - CAN/QC-Surete du Quebec|| GPAD|C31321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31321_01 - CAN/QB - La Commission de la santé et de la sécuri|| GPAD|C31323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31323_01 - NSW Parliament|| GPAD|C31356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31356_01 - CAIRNS REGIONAL COUNCIL|| GPAD|C31370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31370_01 - CRIMTRAC AGENCY|| GPAD|C31578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31578_01 - Oulun seutu|| GPAD|C31580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31580_01 - PARLIAMENT OF NSW|| GPAD|C31583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31583_01 - Porin seutukunta karhukunnat|| GPAD|C31603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31603_01 - Salon seutukunta|| GPAD|C31647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31647_01 - TOOWOOMBA REGIONAL COUNCIL|| GPAD|C31663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31663_01 - Vaasan seutukunta|| GPAD|C31666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31666_01 - VICTORIAN ELECTORAL COMMISSION|| GPAD|C31693_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31693_01 - KY Dept. of Children & Familie|| GPAD|C31798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31798_01 - OH - Ohio Auditor of State|| GPAD|C31800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31800_01 - CA - Secretary of State|| GPAD|C31801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31801_01 - Justice Technology Services|| GPAD|C31803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31803_01 - CAN/QC - Surete du Quebec|| GPAD|C31806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31806_01 - Government of Newfoundland|| GPAD|C31810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31810_01 - CAN/QC - Le Directeur général des élections|| GPAD|C39999_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_11 - Other Sub Sector GPHR (old sub-sector)|| GPAD|C39999_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_12 - Other Sub Sector GPAD|| GPAD|C39999_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_13 - Other Sub Sector GPDV (old sub-sector)|| GPAD|C39999_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_14 - Other Sub Sector GPJU (old sub-sector)|| GPAD|C39999_15|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_15 - Other Sub Sector GPRE (old sub-sector)|| GPAD|C39999_16|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_16 - Other Sub Sector GPIN (old sub-sector)|| GPAD|C39999_17|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_17 - Other Sub Sector GPSS (old sub-sector)|| GPAD|C39999_30|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C39999_30 - Other Sub Sector GPHO (old sub-sector)|| GPAD|C60216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C60216_01 - GroupeX Solutions|| GPAD|C60216_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C60216_02 - GroupeX Solutions|| GPAD|C70599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C70599_01 - CAN/MB - Innovation, Energy and Mines|| GPAD|C80283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80283_01 - VA - Office of the Governor|| GPAD|C80311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80311_01 - CAN/QC - Enseignement sup, Rech, Science et Tech.|| GPAD|C80367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80367_01 - CHESHIRE PROBATION|| GPAD|C80450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80450_01 - DEPARTMENT OF PREMIER & CABINET SERVICE NSW|| GPAD|C80456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80456_01 - State of Michigan|| GPAD|C80457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80457_01 - MN - Pollution Control Agency|| GPAD|C80461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80461_01 - Land Title & Survey Authority of British Columbia|| GPAD|C80477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80477_01 - CAN/MB - Finance|| GPAD|C80501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80501_01 - Bedfordshire_Police|| GPAD|C80508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80508_01 - Cambridgeshire_Police|| GPAD|C80531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80531_01 - Essex_Police|| GPAD|C80554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80554_01 - Lancashire_Probation_Trust|| GPAD|C80568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80568_01 - National_Assembly_for_Wales|| GPAD|C80594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80594_01 - Suffolk_Police|| GPAD|C80596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80596_01 - Surrey_Police|| GPAD|C80607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80607_01 - Wales_Probation_Trust|| GPAD|C80607_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80607_02 - Wales Audit Office|| GPAD|C80608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80608_01 - Welsh_Government|| GPAD|C80638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80638_01 - Thames_Valley_Police|| GPAD|C80639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80639_01 - CAN/QC - Retraite Québec|| GPAD|C80665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80665_01 - CAN/AB - Energy Resources Conservation Board|| GPAD|C80669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80669_01 - Infrastructure Ontario|| GPAD|C80677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80677_01 - TX Comptroller of Public Accounts|| GPAD|C80690_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80690_01 - Silvera for Seniors|| GPAD|C80725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80725_01 - Railroad Commission of Texas|| GPAD|C80731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80731_01 - CAN/QC - Min Agriculture, Pêcheries & Alimentation|| GPAD|C80738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80738_01 - WorkSafe BC|| GPAD|C80765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80765_01 - Ministry of Energy, Mines & Natural Gas|| GPAD|C80799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80799_01 - CAN/QC - Services Québec|| GPAD|C81180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81180_01 - NB Dept of Economic Development|| GPAD|C81196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81196_01 - Bayer. Landeskriminalamt|| GPAD|C81206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81206_01 - Destinations BC|| GPAD|C81208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81208_01 - OH - Office of Information Tech|| GPAD|C81214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81214_01 - MS Dept of Environmental Quali|| GPAD|C81219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81219_01 - PA - State of Pennsylvania|| GPAD|C81221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81221_01 - Workers Compensation Board of Manitoba|| GPAD|C81222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81222_01 - Forestry Innovation Investment Ltd.|| GPAD|C81272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81272_01 - StateofCalifornia|| GPAD|C81273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81273_01 - NJDept.ofTreasury|| GPAD|C81296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81296_01 - MinofInternationalTrade|| GPAD|C81336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81336_01 - CAN/QC - Min Dével durable, Environ Faune et Parcs|| GPAD|C81390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81390_01 - OH - Ohio Judicial Conference|| GPAD|C81400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81400_01 - New Brunswick Internal Services Agency|| GPAD|C81432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81432_01 - DSITIA|| GPAD|C81443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81443_01 - CAN/QC - Société québécoise des infrastructures|| GPAD|C81459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81459_01 - CO - Dept of Health Care Policy & Financing|| GPAD|C10670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C10670_01 - TRS - Teacher Retirement System of Texas|| GPAD|C10670_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C10670_02 - TRS - Teacher Retirement System of Texas|| GPAD|C30617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30617_01 - CEN - KY - Finance and Administration Cabinet|| GPAD|C30617_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30617_02 - CEN - KY - Finance and Administration Cabinet|| GPAD|C10812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C10812_01 - BC - Games Society|| GPAD|C10813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C10813_01 - BC - Seniors Games Society|| GPAD|C81518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81518_01 - VA - Dept of Behavioral Health & Developmental Srv|| GPAD|C81526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81526_01 - CO - Dept of Personnel & Administration|| GPAD|C81533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81533_01 - CAN/QC - Min. Énergie et Ressources naturelles|| GPAD|C21791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C21791_01 - ATB Financial|| GPAD|C30111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30111_01 - EAS - VA - Dept of Revenue|| GPAD|C30120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30120_01 - ENV - S and L - KYY DEP|| GPAD|C30124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30124_01 - Florida (State)|| GPAD|C30124_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30124_02 - Florida (State)|| GPAD|C30150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30150_01 - IT/Net - Ottawa Inc|| GPAD|C30150_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30150_02 - IT/Net - Ottawa Inc|| GPAD|C30150_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30150_03 - IT/Net - Ottawa Inc|| GPAD|C30154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30154_01 - Key Services|| GPAD|C30159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30159_01 - LCBO|| GPAD|C30173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30173_01 - Min of Community Safety and Correctional S|| GPAD|C30180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30180_01 - Ministry of Agriculture and Lands|| GPAD|C30182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30182_01 - Ministry of children and family|| GPAD|C30183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30183_01 - Ministry of Community & Social Services|| GPAD|C30190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30190_01 - Ministry of the Environment|| GPAD|C30191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30191_01 - Ministry of Tourism, Sport and the Arts|| GPAD|C30195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30195_01 - Ministere de la justice - Bureau des infr|| GPAD|C30203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30203_01 - MN - Dept of revenue|| GPAD|C30211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30211_01 - Musée d'art contemporain|| GPAD|C40396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C40396_01 - Københavns Amt - BLOKERET|| GPAD|C40403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C40403_01 - Sønderjyllands Amt BLOKERET brug 57800|| GPAD|C70600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C70600_01 - Iowa Finance Authority|| GPAD|C80424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80424_01 - CAN/NS - Dept of Natural Resources|| GPAD|C80675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80675_01 - Workers Compensation Board of Manitoba|| GPAD|C80708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80708_01 - CA Department of Parks and Recreation|| GPAD|C80783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80783_01 - Min. Mobiliteit en Openbare Werken|| GPAD|C80804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80804_01 - Min. Mobiliteit en Openbare Werken|| GPAD|C80816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80816_01 - NM - State of New Mexico|| GPAD|C81394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81394_01 - LA Dept of Environmental Quality|| GPAD|C30894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30894_01 - State of Oregon - Dept. of Social Services|| GPAD|C30896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30896_01 - Legislative Assembly of Ontario|| GPAD|C30900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30900_01 - Saskatchewan Ministry of Environment|| GPAD|C30903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30903_01 - MD Dept. of Environment|| GPAD|C30913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30913_01 - FL Dept of Management Services|| GPAD|C30914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30914_01 - UT Department of Air Quality (DAQ)|| GPAD|C30914_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30914_02 - UT Department of Air Quality (DAQ)|| GPAD|C30917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30917_01 - VA Dept of Corrections|| GPAD|C30924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30924_01 - Millenium Challenge Corporation (MCC)|| GPAD|C30930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30930_01 - TCEQ|| GPAD|C30932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30932_01 - VicRoads|| GPAD|C30975_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30975_03 - CO - Dept of Transportation|| GPAD|C31012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31012_01 - Commonwealth of Pennsylvania|| GPAD|C31018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31018_01 - LA Dept of Revenue|| GPAD|C31028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31028_01 - CA - Department of Insurance|| GPAD|C31047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31047_01 - GAPP Inc.|| GPAD|C31048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31048_01 - WI - Department of children and families|| GPAD|C31060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31060_01 - State of Pennsylvania|| GPAD|C31073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31073_01 - NC - Department of Transportation|| GPAD|C31075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31075_01 - Financial Information System for California|| GPAD|C31079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31079_01 - Livery Transport Services|| GPAD|C31094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31094_01 - State of North Dakota|| GPAD|C31101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31101_01 - Institute for Citizen-Centred Service|| GPAD|C31127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31127_01 - MI - Department of Treasury|| GPAD|C31154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31154_01 - NYS Insurance Fund|| GPAD|C31164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31164_01 - FL - Office State Courts Administrator (OSCA)|| GPAD|C31177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31177_01 - LA - Department of Agriculture|| GPAD|C31257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31257_01 - Texas Guaranteed Student Loan Corp.|| GPAD|C31260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31260_01 - West Central Florida AAA|| GPAD|C31278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31278_01 - MCCCF - Min. de la Culture, Comm. & Cond. féminine|| GPAD|C31285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31285_01 - FTQ Construction|| GPAD|C31298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31298_01 - Minnesota Department of Labor and Industry|| GPAD|C31303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31303_01 - Vermont Administrative Services Division|| GPAD|C31318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31318_01 - ED - Department of Education (ED)|| GPAD|C31324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31324_01 - CAN/NS - Dept of Labour and Advanced Education|| GPAD|C31343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31343_01 - Boden Kommun|| GPAD|C31388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31388_01 - DEPARTMENT OF EDUCATION (VICTORIA)|| GPAD|C31391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31391_01 - DEPARTMENT OF PLANNING & COMMUNITY DEVELOPMENT|| GPAD|C30221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30221_01 - NY Dept of Civil Service|| GPAD|C30222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30222_01 - NY Dept of Public Service|| GPAD|C30225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30225_01 - NY Temp ans Disabilitu Asst|| GPAD|C30229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30229_01 - NYS Cyber Security and Critical Infrastructure|| GPAD|C30247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30247_01 - OR Dept of Revenue|| GPAD|C30247_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30247_02 - OR Dept of Revenue|| GPAD|C30251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30251_01 - PA Dept of Revenue|| GPAD|C30251_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30251_02 - PA Dept of Revenue|| GPAD|C30255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30255_01 - Place des Arts|| GPAD|C30291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30291_01 - Soc. des etablissements Plein-Air Quebec|| GPAD|C30292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30292_01 - Société de la Place des Arts|| GPAD|C30293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30293_01 - Societe General Financement du Quebec|| GPAD|C30343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30343_01 - Virginia Employment Commission|| GPAD|C30346_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30346_02 - Washington (State of)|| GPAD|C30347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30347_01 - Ades, AZ|| GPAD|C30003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30003_01 - AB Solicitor General and Public Security|| GPAD|C30005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30005_01 - NJ Dept of Children and Families|| GPAD|C30006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30006_01 - Agence de l'efficacité énergétique|| GPAD|C30039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30039_01 - CA - Public Emp Retirement System|| GPAD|C30045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30045_01 - CEN - IL - Dept of Employment Services|| GPAD|C30047_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30047_02 - CEN - LA - State|| GPAD|C30048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30048_01 - CEN - MO - Sam II|| GPAD|C30084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30084_01 - Conseil de gestion de l'ass. parentale|| GPAD|C30095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30095_01 - Department of Environment|| GPAD|C30759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30759_01 - Missouri State|| GPAD|C30782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30782_01 - Saskatchewan Ministry of Agriculture|| GPAD|C30791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30791_01 - Department of Employment Training and the Arts|| GPAD|C30803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30803_01 - Intergovernmental Relations Secretariat|| GPAD|C30821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30821_01 - Kentucky Transporation Cabinet|| GPAD|C30824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30824_01 - NWT Environment and Natural Resources|| GPAD|C30829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30829_01 - NB Department of Justice|| GPAD|C30831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30831_01 - Roads Corporation|| GPAD|C30870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30870_01 - Saskatchewan Indian Gaming Authority Inc.|| GPAD|C30871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30871_01 - BC - Public Service Agency|| GPAD|C30876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30876_01 - Ministere des Relations avec les Citoyens et l'Immigration|| GPAD|C30349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30349_01 - Arizona - Dept of Transportation|| GPAD|C30350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30350_01 - CACS REV, AZ|| GPAD|C30351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30351_01 - CACS Ecom. Security, AZ|| GPAD|C30364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30364_01 - WI - Dept. of health and family services|| GPAD|C30371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30371_01 - AMS MSC|| GPAD|C30381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30381_01 - EAS - Mass - Comptroller|| GPAD|C30537_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30537_02 - HI - Dept. of taxation|| GPAD|C30574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30574_01 - Alberta - Association of colleges|| GPAD|C30582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30582_01 - Sate of New York|| GPAD|C30584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30584_01 - New Jersey|| GPAD|C30615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30615_01 - Maintenance All Clients|| GPAD|C30616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30616_01 - NYS Banking Department|| GPAD|C30641_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30641_04 - CRSBP Chaudière-Appalaches|| GPAD|C30641_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30641_05 - CRSBP Côte-Nord|| GPAD|C30641_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30641_06 - CRSBP Gaspésie|| GPAD|C30653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30653_01 - Gestion des R.H. - Min. du travail|| GPAD|C30658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30658_01 - Investissement Québec|| GPAD|C30658_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30658_02 - Investissement Québec|| GPAD|C30668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30668_01 - Ministère de l'industrie, du commerce et de science|| GPAD|C30675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30675_01 - SIQ - Société immobilière du Québec|| GPAD|C30676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30676_01 - Sous-secrétariat à la gestion intégrée des RH|| GPAD|C30704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30704_01 - Medina County|| GPAD|C30717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30717_01 - State of Rhode Island|| GPAD|C30718_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30718_01 - State of Vermont|| GPAD|C30719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30719_01 - State of Wisconsin|| GPAD|C30751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30751_01 - Washington Dept of Early Learning|| GPAD|C30751_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30751_02 - Washington Dept of Early Learning|| GPAD|C60334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C60334_01 - REGIE DU PAYS CHARTAIN|| GPAD|C10433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C10433_01 - SAAQ - Societe de l'assurance automobile du Quebec|| GPAD|C51890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C51890_01 - IBM|| GPAD|C10100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C10100_01 - CDPQ - Centre de développement du porc du Québec Inc.|| GPAD|C11071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C11071_01 - VA Retirement System (VRS)|| GPAD|C80121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80121_01 - EDS - Electronic Data Systems|| GPAD|C30102_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30102_02 - Division of Wildlife|| GPAD|C81557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81557_01 - Victoria Police Department|| GPAD|C81570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81570_01 - CAN/BC - Min of Jobs, Tourism and Skills Training|| GPAD|C81588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81588_01 - UT - Dept of Administration Serv, Div of Finance|| GPAD|C81597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81597_01 - SD - State of South Dakota|| GPAD|C81598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81598_01 - Societe du Centre des Congres de Quebec|| GPAD|C31173_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31173_02 - Ontario Securities Commission|| GPAD|C81686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81686_01 - Ministere de la Justice du Quebec|| GPAD|C81699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81699_01 - Office Franco-Qu?becois Pour La Jeunesse|| GPAD|C30782_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30782_02 - CAN/SK - Ministry of Central Services|| GPAD|C31159_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GFAD_Att|C31159_03 - Workers' Compensation Board - Alberta|| GPAD|C81718_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81718_01 - Dept of Education Training & Employment|| GPAD|C81724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81724_01 - ServiceFirst|| GPAD|C81738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81738_01 - TX - Employees Retirement System of Texas|| GPAD|C30155_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30155_02 - Kronos Canada Inc.|| GPAD|C81180_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81180_02 - AZ - Dept of Economic Security|| GPAD|C30920_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30920_02 - Mus�e des Beaux-Arts de Montr�al|| GPAD|C30351_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30351_02 - AZ - Dept of Economic Security|| GPAD|C81851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81851_01 - O.A.C.I.Q.|| GPAD|C81852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81852_01 - SOC. TRAV.QC|| GPAD|C81865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81865_01 - Bureau de la securite privee|| GPAD|C80457_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C80457_02 - MN - Pollution Control Agency|| GPAD|C81910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81910_01 - Plzensky kraj|| GPAD|C81904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81904_01 - Assoc. Prov. Constructeurs D'Habitations QC Inc|| GPAD|C81929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81929_01 - NS Department of Internal Services|| GPAD|C31652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31652_01 - Naantalin kaupunki|| GPAD|C81936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81936_01 - CAN/QC - Min Aff. munic. et Occup. terr.|| GPAD|C81944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81944_01 - CAN/AB - Alberta Municipal Affairs|| GPAD|C81945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C81945_01 - Societe des alcools du Quebec (SAQ)|| GPAD|C81996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C81996_01 - NM - State of New Mexico|| GPAD|C82009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82009_01 - Ministry of the Brussels Community|| GPAD|C82045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82045_01 - CAN/ON - County of Renfrew|| GPAD|C82046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82046_01 - CAN/ON - Min of Economic Development & Innovation|| GPAD|C82133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82133_01 - Alabama Managed Advantage|| GPAD|C82135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82135_01 - Arizona UI Tax Central Office|| GPAD|C82169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82169_01 - State of Colorado|| GPAD|C82170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82170_01 - State of Nevada|| GPAD|C82171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82171_01 - State of Vermont|| GPAD|C82178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82178_01 - DARS|| GPAD|C82180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82180_01 - Arizona Dept of Economic Sec|| GPAD|C82192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82192_01 - Legal Aid Ontario|| GPAD|C82194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82194_01 - MO - Dept of Natural Resources (DNR)|| GPAD|C82344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82344_01 - VGQ - V�rificateur g�n�ral du Qu�bec|| GPAD|C82349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82349_01 - TSASK|| GPAD|C82355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82355_01 - QUEENSLAND OMBUDSMAN|| GPAD|C82362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82362_01 - Ministere des Transports|| GPAD|C82374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82374_01 - State of Michigan|| GPAD|C82379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82379_01 - Virginia Retirement System - GSA Contrac|| GPAD|C82413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82413_01 - Idaho Transportation Department|| GPAD|C82470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82470_01 - Commission de la construction du Qu�bec|| GPAD|C82487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82487_01 - Mus�e Can. Histoire|| GPAD|C82533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82533_01 - State of Wyoming|| GPAD|C82570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82570_01 - Arizona UI Tax Central Office|| GPAD|C82577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82577_01 - Wyoming State Auditor|| GPAD|C82638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82638_01 - Columbus Consolidated Government|| GPAD|C82693_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82693_01 - Mississippi Dep.of Environmental Quality|| GPAD|C82709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82709_01 - State of Wisconsin|| GPAD|C82711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82711_01 - Illinois Dept of Employment Security|| GPAD|C82742_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82742_01 - State of West Virginia|| GPAD|C82773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82773_01 - NS Dept. of Transportation|| GPAD|C82774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82774_01 - NB Community College - Moncton|| GPAD|C82775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82775_01 - Flextrack - NB|| GPAD|C82779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82779_01 - NB Dept. of Finance|| GPAD|C82780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82780_01 - Flextrack - NS|| GPAD|C82786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82786_01 - Union des municipalitTs du QuTbec|| GPAD|C82797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82797_01 - Service AB|| GPAD|C82799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82799_01 - Louisiana Departm.of Environmtl. Quality|| GPAD|C82809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82809_01 - South Dakota|| GPAD|C82827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82827_01 - AMPCONTROL AUTOMATION|| GPAD|C82843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82843_01 - CAN/NB - Dept of Agr. & Aquaculture & Fisheries|| GPAD|C82847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82847_01 - CAN/QC - CIUSSS Centre-Ouest-�le-Montr�al|| GPAD|C82848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82848_01 - CAN/QC - CIUSSS Nord-�le-Montr�al|| GPAD|C82855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82855_01 - States of Jersey|| GPAD|C82882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82882_01 - StateofAlaska|| GPAD|C82884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82884_01 - OregonDepartmentofHumanServices|| GPAD|C82885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82885_01 - FRANCHISETAXBOARD|| GPAD|C82895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82895_01 - NorthCarolina(DOR)|| GPAD|C82907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82907_01 - ArizonaUITaxCentralOffice|| GPAD|C82945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82945_01 - Maryland Dept. of General Services|| GPAD|C82950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82950_01 - West Virginia DEP|| GPAD|C82951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82951_01 - Pennsylvania DOR|| GPAD|C82953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82953_01 - State of Maryland|| GPAD|C82969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82969_01 - Public Service CO NH - GEN|| GPAD|C82974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82974_01 - Public Service CO NH - GEN|| GPAD|C82975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82975_01 - State of Massachusetts|| GPAD|C82997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C82997_01 - CAN/QC � CIUSSS Centre-Sud-de-l��le-de-Montr�al|| GPAD|C83053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83053_01 - CAN/AB - Service Alberta|| GPAD|C83103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83103_01 - Department of State Growth|| GPAD|C83101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83101_01 - DEPT OF JUSTICE - TAS|| GPAD|C83100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83100_01 - VICTORIAN DEPARTMENT OF JUSTICE|| GPAD|C83117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83117_01 - SEPAQ - Soci?t? des ?tabl. de plein air du Quebec|| GPAD|C83118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83118_01 - CAN/AB - Appeals Commission for Alberta WCB|| GPAD|C83120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83120_01 - Information Services Corporation of Saskatchewan|| GPAD|C83143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83143_01 - Legal Aid Ontario|| GPAD|C83225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83225_01 - VA - State Board of Elections|| GPAD|C83262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83262_01 - CAN/QC - Le Directeur g?n?ral des ?lections|| GPAD|C83274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83274_01 - Suojelupoliisi|| GPAD|C83275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83275_01 - Suojelupoliisi|| GPAD|C83284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83284_01 - Styrelsen for Vand- og Naturforvaltning|| GPAD|C83293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83293_01 - CAN/BC - City of Abbotsford|| GPAD|C30832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C30832_01 - CCN - Commission de la Capitale nationale|| GPAD|C31155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C31155_01 - CAN/QC - Soci�t� des Traversiers du Qu�bec|| GPAD|C83321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83321_01 - Valtiokonttori|| GPAD|C83322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83322_01 - Valtiokonttori|| GPAD|C83373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83373_01 - Vreemdelingenketen|| GPAD|C83411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83411_01 - KY - Dept. for Environmental Protection|| GPAD|C83416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83416_01 - Lafayette Consolidated Government|| GPAD|C83123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83123_01 - Office of Systems Integration|| GPAD|C83560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83560_01 - Environment Agency|| GPAD|C83595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83595_01 - Fonds de recherche du Qu�bec|| GPAD|C83739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83739_01 - Arizona UI Tax Central Office|| GPAD|C83820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83820_01 - COLUMBUS, GEORGIA|| GPAD|C83823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83823_01 - COMMONWEALTH OF VIRGINIA|| GPAD|C83824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83824_01 - Community Foundation of NW Indiana|| GPAD|C83827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83827_01 - Consolidated Government of Columbus|| GPAD|C83841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83841_01 - DANE G HANSEN FOUNDATION|| GPAD|C83864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83864_01 - Employees Retirement System of Texas|| GPAD|C83886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83886_01 - FL DEPT OF CHILDREN & FAMILIES|| GPAD|C83887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83887_01 - Florida Dept of Children & Families|| GPAD|C83897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83897_01 - GOOD SAMARITAN SOCIETY|| GPAD|C83936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83936_01 - Kansas Department of Revenue Tax Enforce|| GPAD|C83937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83937_01 - KANSAS DEPT. OF CORRECTIONS|| GPAD|C83938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83938_01 - KENTUCKY DEPT OF ENVIRONMENT|| GPAD|C83944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83944_01 - LA DOA OCD/DRU|| GPAD|C83953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83953_01 - Louisiana Departm.of Environmtl. Quality|| GPAD|C83954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83954_01 - LOUISIANA DEPT OF SOCIAL SERVICES|| GPAD|C83964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83964_01 - MARYLAND DEPARTMENT OF THE ENVIRONMENT|| GPAD|C83977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83977_01 - Mississippi Dep.of Environmental Quality|| GPAD|C83983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C83983_01 - MS Dept of Environmental Quality|| GPAD|C84010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84010_01 - OH DEPT OF PUBLIC SAFETY|| GPAD|C84011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84011_01 - OH INDUSTRIAL COMMISSION|| GPAD|C84017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84017_01 - OSU DEPT. OF AGRICULTURE|| GPAD|C84049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84049_01 - Railroad Commission of Texas|| GPAD|C84059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84059_01 - ROCKVILLE MD (CITY)|| GPAD|C84086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84086_01 - St of Minnesota Dept of Human Services|| GPAD|C84092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84092_01 - STATE CORPORATION COMMISSION|| GPAD|C84093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84093_01 - State of Alabama, Dept of Finance, SBS|| GPAD|C84094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84094_01 - State of Louisiana|| GPAD|C84095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84095_01 - State of Missouri|| GPAD|C84096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84096_01 - State of South Dakota|| GPAD|C84098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84098_01 - State of Wisconsin|| GPAD|C84143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84143_01 - VA DEPT OF GENERAL SERVICES|| GPAD|C84186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84186_01 - NYC Dist. Council of Carpenters Benefits|| GPAD|C84187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84187_01 - New Jersey Office of Management and Bud|| GPAD|C84194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84194_01 - NYS Department of Labor|| GPAD|C84195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84195_01 - NY DEPT OF PUBLIC SERVICE|| GPAD|C84196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84196_01 - NYS Dept of Civil Service|| GPAD|C84198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84198_01 - NYS Office General Svcs|| GPAD|C84205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84205_01 - Office of Payroll Administration|| GPAD|C84206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84206_01 - NJ Dept. of Children and Families|| GPAD|C84223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84223_01 - USAID/CIO|| GPAD|C84224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84224_01 - CAN/ON - Min of Finance|| GPAD|C84244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84244_01 - NASBA|| GPAD|C84325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84325_01 - American Enterprise|| GPAD|C84353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84353_01 - ID - Dept of Transportation|| GPAD|C84356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84356_01 - IA - State of Iowa|| GPAD|C84362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84362_01 - OH - State of Ohio|| GPAD|C84363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84363_01 - OH - Dept of Administrative Services|| GPAD|C84365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84365_01 - NATIONAL ASSOCIATION OF STATE BOARDS OF ACCOUNTANC|| GPAD|C84368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84368_01 - UT - State of Utah|| GPAD|C84369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84369_01 - AZ - Dept of Economic Security|| GPAD|C84370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84370_01 - AZ - Dept of Transportation|| GPAD|C84404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84404_01 - MO - Dept of Revenue|| GPAD|C84407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GPAD_Att|C84407_01 - NY - State of New York|| Provincial_and_Municipal|GMAD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GMAD|C11112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C11112_01 - CEREDIGION COUNTY COUNCIL|| GMAD|C11139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C11139_01 - London Borough of Brent|| GMAD|C11141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C11141_01 - Manchester UK_Commercial_Non_PSA|| GMAD|C11149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C11149_01 - Northamptonshire Police|| GMAD|C11163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C11163_01 - Staines UK_Commercial_Non_PSA|| GMAD|C22285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C22285_01 - soc de recaudacion y pagos de servicios ltda|| GMAD|C30004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30004_01 - City of Abilene|| GMAD|C30007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30007_01 - NYC TAB|| GMAD|C30029_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30029_02 - City of Austin|| GMAD|C30029_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30029_03 - City of Austin|| GMAD|C30030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30030_01 - Baltimore County|| GMAD|C30030_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30030_02 - Baltimore County|| GMAD|C30030_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30030_03 - Baltimore County|| GMAD|C30032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30032_01 - County of Bexar|| GMAD|C30034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30034_01 - City of Bridgeport|| GMAD|C30035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30035_01 - Broward County, FL|| GMAD|C30035_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30035_02 - County of Broward|| GMAD|C30035_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30035_03 - Broward County, FL|| GMAD|C30035_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30035_04 - Broward County, FL|| GMAD|C30035_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30035_05 - Broward County, FL|| GMAD|C30054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30054_01 - City of Cincinnati|| GMAD|C30057_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30057_02 - City and county of Honolulu|| GMAD|C30057_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30057_03 - City and county of Honolulu|| GMAD|C30058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30058_01 - City of Anaheim, CA|| GMAD|C30058_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30058_02 - City of Anaheim, CA|| GMAD|C30059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30059_01 - City of Aurora|| GMAD|C30060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30060_01 - City of Burnaby|| GMAD|C30061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30061_01 - City of Calgary|| GMAD|C30062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30062_01 - City of Fort Worth, TX|| GMAD|C30063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30063_01 - City of Fresno|| GMAD|C30065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30065_01 - City of Irving|| GMAD|C30068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30068_01 - City of Lethbridge|| GMAD|C30069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30069_01 - City of Medecine Hat|| GMAD|C30070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30070_01 - City of Milpitas|| GMAD|C30073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30073_01 - City of Springfield, WA|| GMAD|C30074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30074_01 - City of Witchita Falls|| GMAD|C30077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30077_01 - Cobb County, GA|| GMAD|C30077_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30077_02 - Cobb County|| GMAD|C30088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30088_01 - County of Contra Costa|| GMAD|C30090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30090_01 - Cumberland County, NC|| GMAD|C30094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30094_01 - City and county of Denver|| GMAD|C30099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30099_01 - City of Detroit|| GMAD|C30108_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30108_02 - EAS -NYC - FISA|| GMAD|C30108_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30108_03 - EAS -NYC - FISA|| GMAD|C30280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30280_01 - San Diego County|| GMAD|C30281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30281_01 - County of San Mateo|| GMAD|C30282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30282_01 - County of Santa Clara|| GMAD|C30287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30287_01 - City of Seattle Light|| GMAD|C30287_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30287_02 - City of Seattle Light|| GMAD|C30301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30301_01 - City of Springfield, IL|| GMAD|C30301_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30301_02 - Springfield, IL (City)|| GMAD|C30302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30302_01 - St-Louis Metro Sewer Dst|| GMAD|C30309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30309_01 - Stationnement de Montreal|| GMAD|C30311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30311_01 - Suffolk County|| GMAD|C30311_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30311_02 - Suffolk County|| GMAD|C30312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30312_01 - SW Florida West Management|| GMAD|C30312_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30312_02 - SW Florida West Management|| GMAD|C30321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30321_01 - Tucson, AZ (City)|| GMAD|C30322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30322_01 - County of Tulare, CA|| GMAD|C30332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30332_01 - Ville de Gatineau|| GMAD|C30332_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30332_02 - Ville de Gatineau|| GMAD|C30335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30335_01 - Ville de Laval|| GMAD|C30336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30336_01 - Ville de Longueuil|| GMAD|C30336_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30336_02 - Ville de Longueuil|| GMAD|C30336_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30336_03 - Ville de Longueuil|| GMAD|C30337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30337_01 - Ville de Montréal|| GMAD|C30337_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30337_02 - Ville de Montreal|| GMAD|C30337_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30337_03 - Ville de Montreal|| GMAD|C30337_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30337_04 - Ville de Montréal|| GMAD|C30337_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30337_05 - Ville de Montréal|| GMAD|C30337_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30337_06 - Ville de Montréal|| GMAD|C30338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30338_01 - Ville de Quebec|| GMAD|C30344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30344_01 - Volusia County, FL|| GMAD|C30344_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30344_02 - Volusia County, FL|| GMAD|C30345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30345_01 - Wake County, NC|| GMAD|C30345_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30345_02 - Wake County, NC|| GMAD|C30359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30359_01 - Los Angeles County, CA|| GMAD|C30359_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30359_02 - Los Angeles County, CA|| GMAD|C30361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30361_01 - Westchester County, NY|| GMAD|C30361_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30361_02 - Westchester County, NY|| GMAD|C30367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30367_01 - City of Yonkers, NY|| GMAD|C30410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30410_01 - Lake County|| GMAD|C30420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30420_01 - South Lakeland District Council|| GMAD|C30423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30423_01 - Ville de Saguenay|| GMAD|C31394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31394_01 - DEPARTMENT OF TRANSPORT, ENERGY & INFRASTRUCTURE SA|| GMAD|C31409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31409_01 - Etela-Pirkanmaan seutukunta|| GMAD|C31425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31425_01 - Forssan seutukunta|| GMAD|C31429_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31429_01 - Gallery of City Prague|| GMAD|C31434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31434_01 - Goteborgs Stad|| GMAD|C31438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31438_01 - Hameenlinnan seutu|| GMAD|C31444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31444_01 - Hiiden seutukunta|| GMAD|C31459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31459_01 - IT.NRW|| GMAD|C31460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31460_01 - Joensuun seutu|| GMAD|C31464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31464_01 - Jyvaskylan seutukunta|| GMAD|C31465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31465_01 - Kainuun maakunta-kuntayhtyma|| GMAD|C31469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31469_01 - Kirkkonummi Municipality|| GMAD|C31472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31472_01 - Københavns Kommune|| GMAD|C31477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31477_01 - Kuopion seutukunta|| GMAD|C31478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31478_01 - Kuuma-kunnat|| GMAD|C31480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31480_01 - Lahden seutu|| GMAD|C31485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31485_01 - Landesamt fur Natur, Umwelt und Verbraucherschutz|| GMAD|C31486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31486_01 - Landeshauptstadt Munchen|| GMAD|C31489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31489_01 - Local Government|| GMAD|C31494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31494_01 - Loimaan seutukunta|| GMAD|C31495_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31495_01 - Lounais-Pirkanmaan seutukunta|| GMAD|C31499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31499_01 - Malmo stad|| GMAD|C31504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31504_01 - Mikkeli region|| GMAD|C31551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31551_01 - Norrkopings Kommun|| GMAD|C31561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31561_01 - orebro Kommun|| GMAD|C31563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31563_01 - Oslo UDE|| GMAD|C31564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31564_01 - Oslo UKE|| GMAD|C31567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31567_01 - Other - Government|| GMAD|C31568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31568_01 - Other - Government|| GMAD|C31569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31569_01 - Other - Government|| GMAD|C31570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31570_01 - Other ? Government|| GMAD|C31571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31571_01 - Other Government|| GMAD|C31574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31574_01 - Others Gov|| GMAD|C31575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31575_01 - Others government|| GMAD|C31576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_01 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_02 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_03 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_04 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_05 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_06 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_09 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_11 - OTHERS LOCAL GOVERNMENT|| GMAD|C31576_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31576_12 - OTHERS LOCAL GOVERNMENT|| GMAD|C30922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30922_01 - Calgary Public Library|| GMAD|C30931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30931_01 - Powys County Council|| GMAD|C30948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30948_01 - Mairie Aix en Provence|| GMAD|C30949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30949_01 - Mairie de Nice|| GMAD|C30954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30954_01 - Lorain Metropolitain Housing Authority|| GMAD|C30970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30970_01 - City of Regina|| GMAD|C30981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30981_01 - Lorain County ODJFS|| GMAD|C30981_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30981_02 - Lorain County ODJFS|| GMAD|C30981_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30981_03 - LorainCountyODJFS|| GMAD|C30992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30992_01 - The Corporation of the City of Vaughan|| GMAD|C31006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31006_01 - NYC Department of Buildings|| GMAD|C31008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31008_01 - Pima County, AZ|| GMAD|C31008_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31008_02 - Pima County, AZ|| GMAD|C31008_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31008_03 - Pima County, AZ|| GMAD|C31011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31011_01 - KDC|| GMAD|C31021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31021_01 - London Borough of Bexley|| GMAD|C31023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31023_01 - Port Arthur Housing Authority|| GMAD|C31036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31036_01 - LA - Department of social services|| GMAD|C31044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31044_01 - Orange County, CA|| GMAD|C31044_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31044_02 - Orange County, CA|| GMAD|C31045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31045_01 - Orange County, FL|| GMAD|C31050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31050_01 - Northampton Borough Council|| GMAD|C31057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31057_01 - City of Ottawa|| GMAD|C31059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31059_01 - Kansas City, MO|| GMAD|C31065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31065_01 - Olmsted County, MN|| GMAD|C31065_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31065_02 - MN Olmsted County|| GMAD|C31066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31066_01 - City of Roanoke, VA|| GMAD|C31067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31067_01 - DuPage County, IL|| GMAD|C31098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31098_01 - City of Mesa, AZ|| GMAD|C31098_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31098_02 - City of Mesa, AZ|| GMAD|C31098_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31098_03 - City of Mesa, AZ|| GMAD|C31099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31099_01 - Ville de Brossard|| GMAD|C31103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31103_01 - York Region|| GMAD|C31103_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31103_02 - York Region|| GMAD|C31107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31107_01 - WA - King County|| GMAD|C31108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31108_01 - WA - King County|| GMAD|C31121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31121_01 - St. Louis|| GMAD|C31128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31128_01 - City of Saint John|| GMAD|C31134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31134_01 - Commonwealth Health Corporation, Bowling Green, KY|| GMAD|C31139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31139_01 - Advantage|| GMAD|C31143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31143_01 - Strathcona County|| GMAD|C31151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31151_01 - Halifax International Airport Authority|| GMAD|C31182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31182_01 - City of Edmonton|| GMAD|C31250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31250_01 - OH - City of Columbia|| GMAD|C31263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31263_01 - City of Columbus|| GMAD|C31263_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31263_02 - City of Columbus|| GMAD|C31291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31291_01 - Corporation of the District of North Vancouver|| GMAD|C31294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31294_01 - CA - City of San Diego|| GMAD|C31312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31312_01 - Dollard-des-Ormeaux, Ville de|| GMAD|C31320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31320_01 - City of Surrey|| GMAD|C31360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31360_01 - CICR|| GMAD|C31362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31362_01 - City of Espoo|| GMAD|C31363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31363_01 - City of Helsinki|| GMAD|C31364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31364_01 - City of Tamperte central administration|| GMAD|C31365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31365_01 - City of Vantaa|| GMAD|C39999_31|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_31 - Other Sub Sector GMHO (old sub-sector)|| GMAD|C40245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40245_01 - Barnsley Metropolitan Borough Council|| GMAD|C40246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40246_01 - Belfast City Council|| GMAD|C40258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40258_01 - HYDE HOUSING|| GMAD|C40260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40260_01 - Isle of Wight Council|| GMAD|C40278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40278_01 - Liverpool City Council|| GMAD|C40279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40279_01 - London Borough of Barnet|| GMAD|C40280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40280_01 - London Borough of Haringey|| GMAD|C40281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40281_01 - London Borough of Waltham Forest|| GMAD|C40285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40285_01 - Nottinghamshire County Council|| GMAD|C40312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40312_01 - States of Guernsey|| GMAD|C40313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40313_01 - STOCKPORT METROPOLITAN BOROUGH COUNCIL|| GMAD|C40322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40322_01 - Warrington Borough Council|| GMAD|C40323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40323_01 - Wiltshire County Council|| GMAD|C31597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31597_01 - RETIREMENT BENEFITS FUND|| GMAD|C31635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31635_01 - Stockholms stad|| GMAD|C31640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31640_01 - Tammisaaren seutukunta|| GMAD|C31641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31641_01 - Tampereen seutukunta|| GMAD|C31676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31676_01 - Other Central Government|| GMAD|C31703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31703_01 - Aarhus Kommune|| GMAD|C31729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31729_01 - Fælles kommune kunde - AS 2007|| GMAD|C31745_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31745_01 - Københavns Kommune|| GMAD|C31749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31749_01 - Køge Kommune|| GMAD|C31753_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31753_01 - Lejre Forsyning A/S|| GMAD|C31754_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31754_01 - Lejre Kommune|| GMAD|C31790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31790_01 - The City of Chilliwack|| GMAD|C31794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31794_01 - City of Riverside|| GMAD|C31807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31807_01 - Resort Municipality Of Whistler|| GMAD|C39999_20|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_20 - Other Sub Sector GMHS (old sub-sector)|| GMAD|C39999_21|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_21 - Other Sub Sector GMAD|| GMAD|C39999_22|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_22 - Other Sub Sector GMDV (old sub-sector)|| GMAD|C39999_23|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_23 - Other Sub Sector GMJU (old sub-sector)|| GMAD|C39999_24|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_24 - Other Sub Sector GMRE (old sub-sector)|| GMAD|C39999_25|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_25 - Other Sub Sector GMIN (old sub-sector)|| GMAD|C39999_26|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C39999_26 - Other Sub Sector GMUC (old sub-sector)|| GMAD|C51415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C51415_01 - National Road and Highway Directorate SK|| GMAD|C51526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C51526_01 - RSD CZ|| GMAD|C60211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60211_01 - Halifax Regional Municipality|| GMAD|C60237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60237_01 - KU LEUVEN|| GMAD|C60282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60282_01 - Bodens Kommun|| GMAD|C60284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60284_01 - Boras Stad|| GMAD|C60286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60286_01 - Eskilstuna kommun|| GMAD|C60288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60288_01 - Halmstads kommun|| GMAD|C60294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60294_01 - Landstinget Gavleborg|| GMAD|C60295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60295_01 - Linkopings kommun|| GMAD|C60303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60303_01 - Statens Service Myndighet|| GMAD|C60305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60305_01 - Sundsvalls kommun|| GMAD|C60307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60307_01 - Umea kommun|| GMAD|C60309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60309_01 - Vasteras Stad|| GMAD|C60326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60326_01 - EDINBURGH CITY COUNCIL|| GMAD|C60327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60327_01 - LOGAN CITY COUNCIL(Vendor No. LOG190)|| GMAD|C80156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80156_01 - Dublin CC|| GMAD|C80244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80244_01 - KIRKLEES COUNCIL|| GMAD|C80933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80933_01 - Derbyshire County Council|| GMAD|C80322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80322_01 - NB Career Development Action Group|| GMAD|C80396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80396_01 - City of Medicine Hat|| GMAD|C80520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80520_01 - Communities_&_Local_Government|| GMAD|C80631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80631_01 - Met_Police|| GMAD|C80670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80670_01 - QC - Ville de Sherbrooke|| GMAD|C80707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80707_01 - Lulea kommun|| GMAD|C80723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80723_01 - Mancomunidad THAM|| GMAD|C80819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80819_01 - BC - City of Pitt Meadows|| GMAD|C81244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81244_01 - OH - Lorain County ODJFS|| GMAD|C81245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81245_01 - City of Kelowna|| GMAD|C81288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81288_01 - NYCDOITT|| GMAD|C81305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81305_01 - CAN/BC-NewWestminsterPoliceDepartment|| GMAD|C81363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81363_01 - County of San Diego|| GMAD|C81369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81369_01 - Municipalities|| GMAD|C81410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81410_01 - ALPI40|| GMAD|C81438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81438_01 - Municipal Property Assessment Corporation|| GMAD|C81446_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81446_01 - PA - City of Philadelphia|| GMAD|C81454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81454_01 - Camara Municipal de Matosinhos|| GMAD|C81458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81458_01 - CAN/AB - Strathcona County|| GMAD|C30109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30109_01 - EAS - NYC - HRA|| GMAD|C30126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30126_01 - Fort Calgary Historic Society|| GMAD|C30127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30127_01 - County of Franklin|| GMAD|C30129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30129_01 - Fulton County, GA|| GMAD|C30131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30131_01 - City of Garland|| GMAD|C30132_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30132_02 - Georgia Municipal Association|| GMAD|C30138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30138_01 - Town of Hempstead|| GMAD|C30158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30158_01 - Lane County|| GMAD|C30161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30161_01 - Lethbridge Police Service|| GMAD|C30162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30162_01 - Los Alamos County|| GMAD|C30592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30592_01 - City of Cleveland|| GMAD|C30592_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30592_02 - City of Cleveland|| GMAD|C30594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30594_01 - Copeland Borough Council|| GMAD|C30620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30620_01 - City of Kingston (Corporation)|| GMAD|C30620_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30620_02 - Corporation of the City of Kingston|| GMAD|C30636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30636_01 - Stadt Duesseldorf|| GMAD|C30688_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30688_01 - NYC Department of Finance|| GMAD|C30696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30696_01 - Allegheny County|| GMAD|C30696_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30696_02 - Allegheny County|| GMAD|C30696_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30696_03 - Allegheny County|| GMAD|C30709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30709_01 - Muskingum County|| GMAD|C30709_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30709_02 - Muskingum County|| GMAD|C30709_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30709_03 - Muskingum County|| GMAD|C30729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30729_01 - City of Dallas|| GMAD|C30730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30730_01 - FL City of Gainesville|| GMAD|C30730_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30730_02 - FL City of Gainesville|| GMAD|C30731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30731_01 - City of Los Angeles|| GMAD|C30731_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30731_02 - City of Los Angeles|| GMAD|C30731_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30731_03 - City of Los Angeles|| GMAD|C30731_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30731_04 - City of Los Angeles|| GMAD|C30731_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30731_05 - City of Los Angeles|| GMAD|C30732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30732_01 - City of Roanoke|| GMAD|C30732_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30732_02 - City of Roanoke|| GMAD|C30733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30733_01 - City of Tuscon|| GMAD|C30734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30734_01 - Columbus Consolidated Government|| GMAD|C30736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30736_01 - County of Clackamas|| GMAD|C30737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30737_01 - Cuyahoga County|| GMAD|C30742_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30742_01 - Kansas City, KS|| GMAD|C30744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30744_01 - San Bernardino County|| GMAD|C30749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30749_01 - Ventura County, CA|| GMAD|C30749_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30749_02 - Ventura County, CA|| GMAD|C30750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30750_01 - Wake County|| GMAD|C30754_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30754_01 - City of Cincinnati|| GMAD|C30763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30763_01 - Cuyahoga County CSEA|| GMAD|C30763_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30763_02 - Cuyahoga County CSEA|| GMAD|C30763_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30763_03 - Cuyahoga County CSEA|| GMAD|C30763_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30763_04 - Cuyahoga County CSEA|| GMAD|C30764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30764_01 - Cuyahoga County EFS|| GMAD|C30765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30765_01 - Cuyahoga Met Hsg Authority|| GMAD|C30770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30770_01 - Leeds City Council|| GMAD|C30800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30800_01 - Edmonton and Area Corporate Challenge|| GMAD|C30813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30813_01 - Springfield, CU|| GMAD|C30835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30835_01 - Ville de Gatineau|| GMAD|C30854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30854_01 - OMHM - Office municipale d'habitation de Montréal|| GMAD|C30855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30855_01 - NYC Office of Payroll Administration|| GMAD|C30856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30856_01 - Calgary Parking Authority|| GMAD|C30860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30860_01 - Comité de la gestion de la taxe scolaire de l'Ile de Montréal|| GMAD|C30887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30887_01 - Summit County E-Rims|| GMAD|C30887_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30887_02 - Summit County E-Rims|| GMAD|C30887_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30887_03 - Summit County - Clerk of Courts|| GMAD|C30887_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30887_04 - Summit County - Clerk of Courts|| GMAD|C30888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30888_01 - The Support Network (Edmonton)|| GMAD|C30166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30166_01 - Maricopa County|| GMAD|C30166_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30166_02 - Maricopa County|| GMAD|C30168_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30168_02 - Mecklenburg County|| GMAD|C30169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30169_01 - Metro Sanitary District|| GMAD|C30170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30170_01 - City of Midland, TX|| GMAD|C30170_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30170_02 - City of Midland|| GMAD|C30171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30171_01 - County of Milwaukee|| GMAD|C30207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30207_01 - City of Modesto, CA|| GMAD|C30208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30208_01 - Monterey County, CA|| GMAD|C30217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30217_01 - City of Norfolk|| GMAD|C30217_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30217_02 - City of Norfolk|| GMAD|C30228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30228_01 - NYC Department of Corrections|| GMAD|C30228_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30228_02 - NYC Financial Information Serv|| GMAD|C30228_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30228_03 - NYC Dept of Info Tech Telecom|| GMAD|C30228_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30228_04 - NYC Human Resources Administration|| GMAD|C30236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30236_01 - Ocean County, NJ|| GMAD|C30236_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30236_02 - Ocean County, NJ|| GMAD|C30245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30245_01 - Olmstead County, MN|| GMAD|C30245_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30245_02 - Olmstead County, MN|| GMAD|C30248_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30248_02 - Orange County, FL|| GMAD|C30252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30252_01 - Palm Beach County|| GMAD|C30252_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30252_02 - Palm Beach County|| GMAD|C30252_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30252_03 - Palm Beach County (Healthcare District)|| GMAD|C30254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30254_01 - City of Phoenix|| GMAD|C30256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30256_01 - City of Portland|| GMAD|C30257_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30257_02 - Prince William County|| GMAD|C30268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30268_01 - City of Regina|| GMAD|C30269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30269_01 - Region of Waterloo|| GMAD|C30272_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30272_02 - City of Richmond|| GMAD|C30275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30275_01 - City of Rockville, MD|| GMAD|C30275_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30275_02 - City of Rockville, MD|| GMAD|C30279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30279_01 - Salt Lake County, Utah|| GMAD|C31065_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31065_03 - MN Olmsted County|| GMAD|C11184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C11184_01 - SAN DIEGO CITY EMPLOYEES RETIREMENT SYS|| GMAD|C22344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C22344_01 - San Diego City Employees Retirement System|| GMAD|C81384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81384_01 - Public Utility District No 1 of Cowlitz County, WA|| GMAD|C81487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81487_01 - Rocky View County|| GMAD|C81500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81500_01 - Cree Nation Government|| GMAD|C81503_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81503_01 - Okanagan IT Alliance|| GMAD|C81537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81537_01 - CA - City of Carlsbad|| GMAD|C20141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C20141_01 - City of Fresno|| GMAD|C30100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30100_01 - Direction Generale des Services Informat|| GMAD|C30101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30101_01 - District of North Saanich|| GMAD|C30104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30104_01 - EAS - NYC - CACS Iowa|| GMAD|C30105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30105_01 - EAS - NYC - DOF - NY Services|| GMAD|C30105_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30105_02 - EAS - NYC - DOF - NY Services|| GMAD|C30106_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30106_03 - EAS -NYC - DOF - Pass|| GMAD|C30107_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30107_02 - EAS - NYC - DOF - PVB|| GMAD|C30130_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30130_02 - Gainsville, FL|| GMAD|C30139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30139_01 - Howard County, MD|| GMAD|C30152_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30152_02 - Kansas City, MI|| GMAD|C30209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30209_01 - City of Montreal|| GMAD|C30215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30215_01 - New Orleans|| GMAD|C31687_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31687_01 - Secretaria Distrital de Bogotá|| GMAD|C31744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31744_01 - Københavns Kommune|| GMAD|C60287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60287_01 - Goteborgs Stad|| GMAD|C60296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60296_01 - Local Government|| GMAD|C60298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60298_01 - Malmo stad|| GMAD|C60301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60301_01 - Norrkopings Kommun|| GMAD|C60304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60304_01 - Stockholms stad|| GMAD|C60310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C60310_01 - orebro Kommun|| GMAD|C80449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80449_01 - GRIFFITH CITY COUNCIL|| GMAD|C80555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80555_01 - LB_Brent|| GMAD|C80618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C80618_01 - Ceredigion_County_Council|| GMAD|C81009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81009_01 - Police and crime commissioner for cheshi|| GMAD|C81164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81164_01 - The City of St. Albert|| GMAD|C81177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81177_01 - AB - St. Albert, City of|| GMAD|C81220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81220_01 - GA - Fulton County|| GMAD|C81290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81290_01 - NOCCOG|| GMAD|C81309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81309_01 - NOCCOG|| GMAD|C81329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81329_01 - QC - Ville de Terrebonne|| GMAD|C81370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81370_01 - SERVIÇOS MUNICIPALIZADOS DE VISEU|| GMAD|C30891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30891_01 - Communauté d'Agglomération du Grand Besançon|| GMAD|C30912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30912_01 - Oakland Public Housing Authority|| GMAD|C30925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30925_01 - Allegheny County - Juvenille Court|| GMAD|C30939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30939_01 - Association des musiciens municipaux du Québec|| GMAD|C30951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30951_01 - Ville de Saint-Lambert|| GMAD|C30955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30955_01 - Allegheny County - Sheriff's Department|| GMAD|C30959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30959_01 - DSAS|| GMAD|C30963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30963_01 - CCINCA - Chambre de commercet et d'industrie Côte d'Azur|| GMAD|C30965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30965_01 - Fondation du Centre Jeunesse de Montréal|| GMAD|C30966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30966_01 - Ville de Lévis|| GMAD|C30980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30980_01 - Cuyahoga Metro Housing Authority (CMHA)|| GMAD|C30980_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30980_02 - Cuyahoga Metro Housing Authority (CMHA)|| GMAD|C30986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30986_01 - Institut Canadien de Québec|| GMAD|C31000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31000_01 - Chambre de commerce de Québec|| GMAD|C31010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31010_01 - Le Jardin de la Relève|| GMAD|C31037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31037_01 - City of Mecklenburg|| GMAD|C31043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31043_01 - Orange County, LA|| GMAD|C31097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31097_01 - NYC Human Resources Administration|| GMAD|C31102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31102_01 - The Regional Municipality of Halton|| GMAD|C31188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31188_01 - Allegheny County Dept of Court Records|| GMAD|C31189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31189_01 - OH Broward County Clerk of Courts|| GMAD|C31231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31231_01 - Ville de Blainville|| GMAD|C31258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31258_01 - City of Airdrie|| GMAD|C31264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31264_01 - Toronto Port Authority|| GMAD|C31280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31280_01 - Centre communautaire juridique de Montreal|| GMAD|C31286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31286_01 - Comite paritaire de l'entretien d'edifice publics|| GMAD|C31473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31473_01 - Københavns Kommune, Teknik og Miljø|| GMAD|C31482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31482_01 - LAND AND PROPERTY INFORMATION|| GMAD|C31562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31562_01 - Oslo Kommune|| GMAD|C31605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31605_01 - Santa Casa da Misericordia de Lisboa|| GMAD|C30234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30234_01 - OMHM - Office Municipal d'Habitation de Montréal|| GMAD|C30249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30249_01 - Osceola County|| GMAD|C30277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30277_01 - City of Sacramento, CA|| GMAD|C30296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30296_01 - Societe des etablissements de plein air|| GMAD|C30317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30317_01 - Town of Sidney|| GMAD|C30329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30329_01 - Vancouver Island Aboriginal|| GMAD|C30330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30330_01 - Ville de Boisbriand|| GMAD|C30331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30331_01 - Ville de Chateauguay|| GMAD|C30333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30333_01 - Ville de Hampstead|| GMAD|C30334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30334_01 - Ville de Lasalle|| GMAD|C30339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30339_01 - Ville de Repentigny|| GMAD|C30340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30340_01 - Ville de St-Bruno|| GMAD|C30341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30341_01 - Ville de Varennes|| GMAD|C30027_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30027_02 - City of Ann Arbor|| GMAD|C30052_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30052_02 - CEN - TX - City of Dallas|| GMAD|C30052_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30052_03 - City of Dallas, TX|| GMAD|C30052_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30052_04 - City of Dallas, TX|| GMAD|C30071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30071_01 - City of Oakland|| GMAD|C30072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30072_01 - City of Plymouth|| GMAD|C30075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30075_01 - Clackamus|| GMAD|C30079_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30079_02 - Columbus, GA|| GMAD|C30091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30091_01 - Cuyahoga, OH (City of)|| GMAD|C30761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30761_01 - Providence|| GMAD|C30798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30798_01 - NYC Dept. of Citywide Administrative Services|| GMAD|C30804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30804_01 - Muskingham County, Job/Fam Services|| GMAD|C30804_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30804_02 - Muskingham County, Job/Fam Services|| GMAD|C30881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30881_01 - Cuyahoga Workforce Development|| GMAD|C30884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30884_01 - OCPM - Office de Consultation Publique de Montreal|| GMAD|C30886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30886_01 - Cuyahoga County DSAS|| GMAD|C40108_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40108_02 - DSAS|| GMAD|C30358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30358_01 - Orange County, LA - Bernardino Audit|| GMAD|C30360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30360_01 - Orange County, LA - Ventura Audit|| GMAD|C30541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30541_01 - City of New York|| GMAD|C30622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30622_01 - Arlington County|| GMAD|C30700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30700_01 - Lorain County|| GMAD|C30702_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30702_01 - Martin County|| GMAD|C30702_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30702_02 - Martin County|| GMAD|C30702_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30702_03 - Martin County|| GMAD|C30711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30711_01 - NYC Housing Authority|| GMAD|C30714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30714_01 - Round Rock|| GMAD|C30716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30716_01 - St-Lucie County|| GMAD|C30716_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30716_02 - St-Lucie County|| GMAD|C30716_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30716_03 - St-Lucie County|| GMAD|C30721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30721_01 - Waukesha|| GMAD|C30745_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30745_01 - Santa Barbara County|| GMAD|C10762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C10762_01 - OMHM - Office municipale d'habitation de Montréal|| GMAD|C10062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C10062_01 - Office of Payroll Administration|| GMAD|C31433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31433_01 - Goteborgs Hamn|| GMAD|C51601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C51601_01 - Svedala|| GMAD|C51357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C51357_01 - Københavns Kommune Koncernservice|| GMAD|C40249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C40249_01 - Cardiff CC|| GMAD|C81554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81554_01 - Port Moody Police Department|| GMAD|C81599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81599_01 - Islands Trust|| GMAD|C81622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81622_01 - Odense Kommune|| GMAD|C81681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81681_01 - C81681_01 - NYS County of Suffolk|| GMAD|C81733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81733_01 - TX - City Public Service of San Antonio|| GMAD|C81734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81734_01 - C81734_01 - Corporation Of The County Of Lambton|| GMAD|C81740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81740_01 - C81740_01 - CAN/QC - Ville de Pointe-Claire|| GMAD|C81741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81741_01 - Societe en Commandite Stationnement de Montreal|| GMAD|C81762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81762_01 - DSS efaktura|| GMAD|C81765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81765_01 - Kr?dsherad Everk|| GMAD|C81768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81768_01 - H?land og Setskog Elverk|| GMAD|C81771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81771_01 - Statsbygg Fakturamottak|| GMAD|C81789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81789_01 - Kongshavn Videreg�ende skole|| GMAD|C81791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81791_01 - Morellbakken skole|| GMAD|C81803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81803_01 - Other Region West|| GMAD|C81804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81804_01 - Other Region Southeast|| GMAD|C81825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81825_01 - Other Region North|| GMAD|C81857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81857_01 - Suffolk County Council|| GMAD|C81858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81858_01 - Staffordshire Police|| GMAD|C81886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81886_01 - Rodovre Kommune|| GMAD|C81892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81892_01 - Kongsberg|| GMAD|C81909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81909_01 - CAN/QC - Ville De Marieville|| GMAD|C30966_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C30966_02 - Ville de Lévis|| GMAD|C81917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81917_01 - City of Cleveland|| GMAD|C31566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C31566_01 - Other - Government|| GMAD|C81962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C81962_01 - NYC Financial Information Services Agency|| GMAD|C82047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82047_01 - Lule� kommun|| GMAD|C82049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82049_01 - Lerums kommun|| GMAD|C82051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82051_01 - Sigtuna kommun|| GMAD|C82056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82056_01 - Nordv�stra Sk�nes Renh�llningsaktiebolag|| GMAD|C82059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82059_01 - Hudiksvalls kommun|| GMAD|C82062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82062_01 - Falu kommun|| GMAD|C82063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82063_01 - �sthammars kommun|| GMAD|C82064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82064_01 - Str�ngn�s kommun|| GMAD|C82066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82066_01 - V�rmd� kommun|| GMAD|C82067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82067_01 - Katrineholms kommun|| GMAD|C82070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82070_01 - Tyres� kommun|| GMAD|C82071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82071_01 - Oskarshamns Kommun, Ekonomiavd.|| GMAD|C82073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82073_01 - Kristianstads Kommun|| GMAD|C82074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82074_01 - Liding� stad|| GMAD|C82077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82077_01 - Sundbybergs Stad|| GMAD|C82078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82078_01 - Sandvikens kommun Fakturaenheten|| GMAD|C82079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82079_01 - Esl�vs kommun|| GMAD|C82080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82080_01 - Tran�s kommun|| GMAD|C82081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82081_01 - Ljungby Kommun|| GMAD|C82082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82082_01 - Upplands V�sby Kommun|| GMAD|C82083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82083_01 - Huddinge Kommun|| GMAD|C82084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82084_01 - Servicef IT-service G�vle kommun|| GMAD|C82086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82086_01 - �ngelholms kommun fakturacentral|| GMAD|C82129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82129_01 - Halmstad kommun|| GMAD|C82143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82143_01 - City of Norfolk|| GMAD|C82144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82144_01 - City of Philadelphia.|| GMAD|C82145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82145_01 - City of Richmond|| GMAD|C82148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82148_01 - DuPage County|| GMAD|C82179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82179_01 - Mecklenburg County|| GMAD|C82201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82201_01 - Alavuden kaupunki|| GMAD|C82211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82211_01 - Haapaveden kaupunki|| GMAD|C82216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82216_01 - Kuntien Tiera Oy|| GMAD|C82217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82217_01 - Loviisan kaupunki|| GMAD|C82220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82220_01 - Oulunkaaren kuntayhtymä|| GMAD|C82223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82223_01 - Paraisten kaupunki|| GMAD|C82228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82228_01 - Porvoon kaupunki|| GMAD|C82229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82229_01 - Raahen kaupunki|| GMAD|C82236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82236_01 - Turun kaupunki|| GMAD|C82240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82240_01 - City of Grand Rapids|| GMAD|C82241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82241_01 - Kent County|| GMAD|C82277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82277_01 - Landstinget Sormland|| GMAD|C82293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82293_01 - Forshaga kommun|| GMAD|C82294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82294_01 - Varnamo kommun|| GMAD|C82298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82298_01 - Trelleborgs kommun|| GMAD|C82302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82302_01 - Varmdo kommun|| GMAD|C82305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82305_01 - Solna stad|| GMAD|C82307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82307_01 - Laholms kommun ref. 117109|| GMAD|C82310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82310_01 - Varmdo Kommun|| GMAD|C82313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82313_01 - orkelljunga kommun (Avd. Ekonomi)|| GMAD|C82314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82314_01 - Vaxjo kommun|| GMAD|C82317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82317_01 - Kungalvs kommun|| GMAD|C82321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82321_01 - angelholms kommun fakturacentral|| GMAD|C82325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82325_01 - Kramfors kommun|| GMAD|C82326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82326_01 - Linkopings kommun|| GMAD|C82328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82328_01 - Burlovs kommun|| GMAD|C82331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82331_01 - Vasterbottens lans landsting|| GMAD|C82334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82334_01 - Tingsryds kommun|| GMAD|C82336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82336_01 - Gavle kommun|| GMAD|C82337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82337_01 - Haninge kommun|| GMAD|C82338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82338_01 - Kalix kommun|| GMAD|C82340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82340_01 - Karlshamns kommun|| GMAD|C82341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82341_01 - Karlskrona Kommun|| GMAD|C82416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82416_01 - County of Monterey|| GMAD|C82434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82434_01 - EDINBURGH CITY COUNCIL|| GMAD|C82435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82435_01 - Stirling Council|| GMAD|C82450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82450_01 - MI - Genesee County|| GMAD|C82539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82539_01 - OH - City of Cincinnati|| GMAD|C82556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82556_01 - VGC - Dienst Financi�n|| GMAD|C82569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82569_01 - County of Tulare CA|| GMAD|C82584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82584_01 - City of Tucson|| GMAD|C82585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82585_01 - City of Aurora|| GMAD|C82586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82586_01 - County of Clackamas|| GMAD|C82587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82587_01 - County of Contra Costa|| GMAD|C82588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82588_01 - City/County of Denver|| GMAD|C82589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82589_01 - City of Fresno|| GMAD|C82590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82590_01 - Lane County Courthouse|| GMAD|C82591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82591_01 - Los Alamos County|| GMAD|C82592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82592_01 - City of Milpitas|| GMAD|C82593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82593_01 - City of Phoenix|| GMAD|C82594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82594_01 - County of San Mateo|| GMAD|C82596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82596_01 - City of Portland|| GMAD|C82598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82598_01 - San Bernardino County|| GMAD|C82599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82599_01 - City of Modesto|| GMAD|C82615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82615_01 - Suffolk County|| GMAD|C82633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82633_01 - Town of Hempstead|| GMAD|C82634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82634_01 - Westchester County|| GMAD|C82639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82639_01 - Orange County FL|| GMAD|C82640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82640_01 - DuPage County|| GMAD|C82681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82681_01 - Lee County Electric Cooperative|| GMAD|C82685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82685_01 - City Public Service of San Antonio|| GMAD|C82694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82694_01 - Fulton County|| GMAD|C82701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82701_01 - City of Detroit|| GMAD|C82702_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82702_01 - City of Garland|| GMAD|C82703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82703_01 - City of Witchita Falls|| GMAD|C82704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82704_01 - City of Fort Worth|| GMAD|C82705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82705_01 - City of Dallas|| GMAD|C82707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82707_01 - County of Milwaukee|| GMAD|C82708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82708_01 - Kansas City KS|| GMAD|C82713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82713_01 - Volusia County FA|| GMAD|C82715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82715_01 - Baltimore County|| GMAD|C82719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82719_01 - Prince William County|| GMAD|C82720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82720_01 - City of Richmond|| GMAD|C82721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82721_01 - City of Rockville MD|| GMAD|C82723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82723_01 - Cumberland County|| GMAD|C82759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82759_01 - New York City Department of Buildings|| GMAD|C82883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82883_01 - LosAngelesCounty|| GMAD|C82886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82886_01 - Merrick|| GMAD|C82887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82887_01 - CityofMesa|| GMAD|C82888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82888_01 - NORFOLK,VA(CITY)|| GMAD|C82919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82919_01 - MNHENNEPINCOUNTY|| GMAD|C82954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82954_01 - Dep. of Public Utilities,City ofColumbus|| GMAD|C82985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82985_01 - City of Riverside|| GMAD|C82989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82989_01 - Salt Lake County UT|| GMAD|C82996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C82996_01 - CAN/NL - City Of St. John's|| GMAD|C83016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83016_01 - Laval Technopole|| GMAD|C83080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83080_01 - MI - Genesee County|| GMAD|C83088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83088_01 - Scottish Borders Council|| GMAD|C83108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83108_01 - Scottish Borders Council|| GMAD|C83110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83110_01 - ON - The Corporation of the City of Vaughan|| GMAD|C83119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83119_01 - CAN/SK - City of Regina|| GMAD|C83147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83147_01 - York Region|| GMAD|C83191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83191_01 - Ulricehamns kommun|| GMAD|C83193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83193_01 - Harryda kommun|| GMAD|C83196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83196_01 - Vanersborgs kommun|| GMAD|C83198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83198_01 - Nassjo kommun|| GMAD|C83199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83199_01 - Ludvika kommun|| GMAD|C83205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83205_01 - Leksands kommun|| GMAD|C83207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83207_01 - Soderhamns Kommun|| GMAD|C83211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83211_01 - Monsteras kommun|| GMAD|C83218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83218_01 - Kingston Police Force|| GMAD|C83242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83242_01 - SCHNEIDER ELECTRIC IT LOGIST|| GMAD|C83246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83246_01 - TASMANIAN FIRE SERVICE|| GMAD|C10398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C10398_01 - R�seau de Transport de la Capitale|| GMAD|C83301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83301_01 - Keravan kaupunki|| GMAD|C83302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83302_01 - Keravan kaupunki|| GMAD|C83304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83304_01 - Helsingin kaupunki Sosiaali- ja|| GMAD|C83306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83306_01 - Helsingin kaupunki Sosiaali- ja|| GMAD|C83311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83311_01 - Helsingin kaupunki Kaupunginkanslia|| GMAD|C83312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83312_01 - Helsingin kaupunki Kaupunginkanslia|| GMAD|C83313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83313_01 - Helsingin kaupunki Sosiaali- ja|| GMAD|C83315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83315_01 - Helsingin kaupunki Sosiaali- ja|| GMAD|C83318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83318_01 - Kankaanp??n kaupunki|| GMAD|C83320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83320_01 - Kankaanp??n kaupunki|| GMAD|C83360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83360_01 - NC - Mecklenberg County|| GMAD|C83494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83494_01 - City of Wausau|| GMAD|C83614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83614_01 - KS - State of Kansas|| GMAD|C83642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83642_01 - City of Chilliwack|| GMAD|C83704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83704_01 - CO - Dept of Personnel & Administration|| GMAD|C83778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83778_01 - BROWARD COUNTY, FL|| GMAD|C83809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83809_01 - City of Cincinnati|| GMAD|C83810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83810_01 - CITY OF CLEVELAND|| GMAD|C83811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83811_01 - City of Detroit|| GMAD|C83812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83812_01 - CITY OF GAINSVILLE|| GMAD|C83813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83813_01 - CITY OF NORFOLK, VIRGINIA|| GMAD|C83817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83817_01 - Cobb County|| GMAD|C83828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83828_01 - County of Milwaukee|| GMAD|C83879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83879_01 - FAIRFAX COUNTY|| GMAD|C83890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83890_01 - Fulton County|| GMAD|C83915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83915_01 - HENNEPIN COUNTY MEDICAL CENTER|| GMAD|C83947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83947_01 - Lee County Electric Cooperative|| GMAD|C83956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83956_01 - Louisiana Housing Corporation|| GMAD|C83970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83970_01 - MECKLINBURG COUNTY|| GMAD|C83979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C83979_01 - MN HENNEPIN COUNTY|| GMAD|C84013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84013_01 - ORANGE COUNTY|| GMAD|C84020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84020_01 - Palm Beach County|| GMAD|C84102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84102_01 - Summit County|| GMAD|C84152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84152_01 - Volusia County FA|| GMAD|C84155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84155_01 - WAKE COUNTY, NC|| GMAD|C84210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84210_01 - OR - City of Springfield|| GMAD|C84226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84226_01 - KS - City of Wichita|| GMAD|C84284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84284_01 - City and County of Denver|| GMAD|C84305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84305_01 - INDEPENDENT FUND ADMINISTRATORS & ADVISE|| GMAD|C84332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84332_01 - City of Montreal|| GMAD|C84359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84359_01 - NYC City of New York|| GMAD|C84375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GMAD_Att|C84375_01 - Ville de Repentigny|| Government|Space_Defense_and_Intelligence|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Space, Defence and Intelligence|| Space_Defense_and_Intelligence|GSIS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GSIS|C11120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C11120_01 - European Space Agency|| GSIS|C11135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C11135_01 - International Space Innovation Centre Ltd|| GSIS|C31417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C31417_01 - European Space Agency|| GSIS|C31458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C31458_01 - International Space Innovation Centre Ltd|| GSIS|C31670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C31670_01 - AEROSPACE INTERNATIONAL SERVICES LTD|| GSIS|C51461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C51461_01 - OTHERS - SPACE & DEFENSE|| GSIS|C51461_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C51461_02 - OTHERS - SPACE & DEFENSE|| GSIS|C51461_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C51461_03 - OTHERS - SPACE & DEFENSE|| GSIS|C51461_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C51461_04 - OTHERS - SPACE & DEFENSE|| GSIS|C51461_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C51461_05 - OTHERS - SPACE & DEFENSE|| GSIS|C51461_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C51461_06 - OTHERS - SPACE & DEFENSE|| GSIS|C80246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C80246_01 - UK SPACE AGENCY|| GSIS|C81072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C81072_01 - BNSC|| GSIS|C81086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C81086_01 - ESA-ESTEC|| GSIS|C81088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C81088_01 - ESRIN|| GSIS|C80642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C80642_01 - ESA-ESTEC|| GSIS|C80642_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C80642_02 - ESA-ESTEC|| GSIS|C80698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C80698_01 - ESRIN|| GSIS|C39999_32|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C39999_32 - Other Sub Sector GSIS|| GSIS|C81118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C81118_01 - INTERNATIONAL SPACE INNOVATION CENTRE LI|| GSIS|C10412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C10412_01 - Sargent Aérospatiale Inc.|| GSIS|C10796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C10796_01 - IFA - Institut de formation aerospatiale|| GSIS|C82114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSIS_Att|C82114_01 - Swedish Space Corporation|| Space_Defense_and_Intelligence|GSID|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GSID|C10994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C10994_01 - QinetiQ|| GSID|C11128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C11128_01 - HMG3|| GSID|C11132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C11132_01 - HP Enterprise Services UK Ltd    should be GFDE|| GSID|C11138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C11138_01 - Lockheed Martin UK Ltd    should be GFDE|| GSID|C11140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C11140_01 - M.O.D.|| GSID|C30093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30093_01 - Defense Logistics Agency|| GSID|C30093_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30093_02 - Defense Logistics Agency / DLIS|| GSID|C30093_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30093_03 - Defense Logistics Agency / DLIS|| GSID|C30093_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30093_04 - Defense Logistics Agency / DLIS|| GSID|C30098_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30098_02 - Department of National Defence|| GSID|C30098_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30098_03 - Department of National Defence|| GSID|C30098_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30098_04 - Department of National Defence|| GSID|C30098_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30098_06 - Department of National Defence|| GSID|C30098_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30098_07 - Department of National Defence|| GSID|C30552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30552_01 - Intelligence|| GSID|C30581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30581_01 - Department of Defense|| GSID|C30581_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30581_02 - Department of Defense - Joint Programs|| GSID|C30581_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30581_03 - US - Department of Defense|| GSID|C30618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30618_01 - Department of Homeland Security|| GSID|C30618_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30618_02 - Department of Homeland Security|| GSID|C30627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30627_01 - CIA|| GSID|C30723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30723_01 - US Air Force|| GSID|C30723_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30723_02 - US Air Force|| GSID|C30723_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30723_03 - US Air Force|| GSID|C30908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30908_01 - Thales Canada|| GSID|C30264_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30264_02 - R et D pour la Defense Canada|| GSID|C31381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31381_01 - Defence Vetting Agency|| GSID|C31385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31385_01 - DEPARTMENT OF DEFENCE|| GSID|C31385_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31385_02 - DEPARTMENT OF DEFENCE|| GSID|C31414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31414_01 - European Defence Agency (EDA)|| GSID|C31415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31415_01 - European GNSS (Global Navigation Satellite System)|| GSID|C31420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31420_01 - FM - Forsvarsmakten|| GSID|C31421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31421_01 - FMV - Forsvarets materielverk|| GSID|C31432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31432_01 - GMV Portugal|| GSID|C31437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31437_01 - GPT Special Project Management Ltd.|| GSID|C31455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31455_01 - HP Enterprise Services UK Ltd|| GSID|C31490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31490_01 - Lockheed Martin UK Ltd|| GSID|C31498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31498_01 - M.O.D.|| GSID|C31506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_01 - MINISTERE DE LA DEFENSE|| GSID|C31506_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_02 - MINISTERE DE LA DEFENSE|| GSID|C31506_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_03 - MINISTERE DE LA DEFENSE|| GSID|C31506_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_04 - MINISTERE DE LA DEFENSE|| GSID|C31506_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_05 - MINISTERE DE LA DEFENSE|| GSID|C31506_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_06 - MINISTERE DE LA DEFENSE|| GSID|C31506_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_09 - MINISTERE DE LA DEFENSE|| GSID|C31506_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_11 - MINISTERE DE LA DEFENSE|| GSID|C31506_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31506_12 - MINISTERE DE LA DEFENSE|| GSID|C31526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31526_01 - Ministry of Defence|| GSID|C31547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31547_01 - NATO|| GSID|C31042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31042_01 - DFAS ERP|| GSID|C31042_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31042_02 - DFAS Non-ERP|| GSID|C31080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31080_01 - ISDEFE - Ingeniería de Sistemas para la Defensa de España|| GSID|C31082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31082_01 - US Army|| GSID|C31085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31085_01 - National Aeronautics and Space Administration|| GSID|C31086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31086_01 - US Marine Corps|| GSID|C31086_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31086_02 - USMC/Marine Corps Systems Command (MCSC)|| GSID|C31087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31087_01 - US Navy (less SPAWAR and NAVAIR)|| GSID|C31088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31088_01 - US Federal - Customer Not Disclosed|| GSID|C31089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31089_01 - Product Resale|| GSID|C31091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31091_01 - Naval Air Systems Command (NAVAIR)|| GSID|C31138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31138_01 - Department of Navy - Military Sealift Command|| GSID|C31138_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31138_02 - Department of Navy - Military Sealift Command|| GSID|C31144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31144_01 - Jacobs|| GSID|C31193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31193_01 - INTEL NGA|| GSID|C31193_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31193_02 - INTEL NGA|| GSID|C31199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31199_01 - Army Centranl Command|| GSID|C31200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31200_01 - Army Forces Command|| GSID|C31202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31202_01 - Army Intelligence and Security Command|| GSID|C31203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31203_01 - Army Material Command|| GSID|C31204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31204_01 - Army Network Enterprise Technology Command|| GSID|C31205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31205_01 - Army Reserve Command|| GSID|C31206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31206_01 - Army Training and Doctrine Command|| GSID|C31208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31208_01 - Defense Information Systems Agency|| GSID|C31209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31209_01 - Defense Intelligence Agency|| GSID|C31212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31212_01 - DOD - Joint Agencies and Commands|| GSID|C31212_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31212_02 - DOD - Joint Strike Fighter|| GSID|C31212_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31212_04 - DOD - US Cyber Command|| GSID|C31212_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31212_05 - DOD - US Transportation Command|| GSID|C31216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31216_01 - Naval Sea Systems Command|| GSID|C31218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31218_01 - Other Defense Agencies|| GSID|C31218_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31218_02 - Other Defense Agencies|| GSID|C31218_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31218_03 - Other Defense Agencies|| GSID|C31218_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31218_04 - Other Defense Agencies|| GSID|C31218_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31218_05 - Other Defense Agencies|| GSID|C31218_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31218_06 - Other Defense Agencies|| GSID|C31218_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31218_07 - Other Defense Agencies|| GSID|C31219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31219_01 - Other Intelligence Agencies|| GSID|C31219_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31219_02 - Other Intelligence Agencies|| GSID|C31219_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31219_03 - Other Intelligence Agencies|| GSID|C31219_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31219_04 - Other Intelligence Agencies|| GSID|C31219_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31219_05 - Other Intelligence Agencies|| GSID|C31219_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31219_06 - Other Intelligence Agencies|| GSID|C31219_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31219_07 - Other Intelligence Agencies|| GSID|C31221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31221_01 - Navy - Others|| GSID|C31221_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31221_02 - Navy - Others|| GSID|C31221_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31221_03 - Navy - Others|| GSID|C31221_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31221_04 - Navy - Others|| GSID|C31221_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31221_05 - Navy - Others|| GSID|C31221_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31221_06 - Navy - Others|| GSID|C31221_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31221_07 - Navy - Others|| GSID|C31225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31225_01 - Entrust|| GSID|C31226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31226_01 - WinMagic|| GSID|C31289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31289_01 - CanadianSecurity&IntelligenceServices|| GSID|C31311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31311_01 - Washington Headquarters Services|| GSID|C31332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31332_01 - Atomic Weapons Establishment|| GSID|C31337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31337_01 - Babcock|| GSID|C31341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31341_01 - Bio Intelligence Service S.A.S|| GSID|C31344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31344_01 - Boeing|| GSID|C31355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31355_01 - Bundeswehr|| GSID|C31359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31359_01 - CESG|| GSID|C31379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31379_01 - Defence Information Systems and Services|| GSID|C31380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31380_01 - Defence Science and Technology Laboratory|| GSID|C31591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31591_01 - QinetiQ|| GSID|C31591_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31591_02 - QinetiQ|| GSID|C31594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31594_01 - Raytheon Systems Ltd|| GSID|C31637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31637_01 - SWM|| GSID|C31659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31659_01 - United Kingdom National Codification Bureau (UK NCB)|| GSID|C31674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31674_01 - Other Defense, Space and Intelligence|| GSID|C31733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31733_01 - Forsvarets Materieltjeneste|| GSID|C31796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31796_01 - DHS/US Coast Guard Service (USCG)|| GSID|C31796_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31796_02 - DHS/US Coast Guard Service (USCG)|| GSID|C31797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31797_01 - DOD/Defense Information Systems Agency (DISA)|| GSID|C31797_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31797_02 - DOD/Defense Information Systems Agency (DISA)|| GSID|C31805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31805_01 - Navy/Commander Operational Test&Eval Force (COTF)|| GSID|C31805_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31805_02 - Navy/Commander Operational Test&Eval Force (COTF)|| GSID|C31808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31808_01 - Navy/Commander Operational Test&Eval Force (COTF)|| GSID|C31811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31811_01 - Army/Army Sustainment Command (ASC)|| GSID|C39999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C39999_02 - Other Sub Sector GFDE (old sub-sector)|| GSID|C39999_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C39999_10 - Other Sub Sector GPDE (old sub-sector)|| GSID|C39999_19|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C39999_19 - Other Sub Sector GMDE (old sub-sector)|| GSID|C60331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C60331_01 - Army/Aviation & Missile Command (AMCOM)|| GSID|C60342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C60342_01 - SplunkInc|| GSID|C80247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80247_01 - HMG13|| GSID|C80828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80828_01 - US Army Special Ops Command (USASOC)|| GSID|C80988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80988_01 - SYSTEMS ENGINEERING AND ASSESSMENT LTD|| GSID|C81007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81007_01 - Ordnance Survey|| GSID|C81034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81034_01 - DEFENCE ESTATES|| GSID|C81070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81070_01 - AWE Aldermaston|| GSID|C81073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81073_01 - Boeing Defence UK Limited|| GSID|C81074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81074_01 - Business 2 Business UK Ltd|| GSID|C81076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81076_01 - Capgemini UK plc|| GSID|C81077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81077_01 - CISCO SYSTEMS|| GSID|C81077_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81077_02 - Cisco Systems Canada Co.|| GSID|C81080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81080_01 - CSC COMPUTER SCIENCES LIMITED|| GSID|C81081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81081_01 - DEFENCE BILLS AGENCY|| GSID|C81082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81082_01 - DEFENCE ESTATES|| GSID|C81085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81085_01 - DSTL|| GSID|C81091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81091_01 - European Defence Agency (EDA)|| GSID|C81095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81095_01 - GMV Aerospace and Defence S.A.U.|| GSID|C81096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81096_01 - GMV SA|| GSID|C81098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81098_01 - GPT Special Project Management Limited|| GSID|C81099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81099_01 - HMG|| GSID|C81100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81100_01 - HMG1|| GSID|C81102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81102_01 - HMG11|| GSID|C81104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81104_01 - HMG14|| GSID|C81105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81105_01 - HMG15|| GSID|C81106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81106_01 - HMG2|| GSID|C81107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81107_01 - HMG3|| GSID|C81109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81109_01 - HMG5|| GSID|C81110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81110_01 - HMG6|| GSID|C81113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81113_01 - HP Enterprise Services UK Ltd|| GSID|C81123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81123_01 - Microsoft|| GSID|C81124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81124_01 - MINISTRY OF DEFENCE|| GSID|C81129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81129_01 - Pikes Peak Ltd|| GSID|C81131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81131_01 - QINETIQ EDM|| GSID|C81133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81133_01 - ROKE MANOR RESEARCH LTD|| GSID|C81134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81134_01 - Scantec|| GSID|C81136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81136_01 - SELEX ES Ltd|| GSID|C81142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81142_01 - SYSTEMS ENGINEERING AND ASSESSMENT LTD|| GSID|C81144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81144_01 - THALES ALENIA SPACE|| GSID|C80317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80317_01 - Pikes Peak Ltd|| GSID|C80318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80318_01 - HMG14|| GSID|C80319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80319_01 - DEFENCE BILLS AGENCY should be GFDE|| GSID|C80319_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80319_03 - Defense Bills Agency|| GSID|C80343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80343_01 - DND - CFWC|| GSID|C80352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80352_01 - GCHQ|| GSID|C80391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80391_01 - CACI|| GSID|C80398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80398_01 - USMC/Logistics Command (LOGCOM)|| GSID|C80398_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80398_02 - USMC/Logistics Command (LOGCOM)|| GSID|C80399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80399_01 - USMC/Systems Command (SYSCOM)|| GSID|C80399_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80399_02 - USMC/Systems Command (SYSCOM)|| GSID|C80427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80427_01 - USMC/MarineCorpsNetworkOperationsSupportCente|| GSID|C80428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80428_01 - Army/PEOSimulation,Training&Instrumentation|| GSID|C80455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80455_01 - DHS/Transportation Security Agency (TSA)|| GSID|C80562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80562_01 - Maritime_and_Coastguard_Agency|| GSID|C80577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80577_01 - Ordnance_Survey|| GSID|C80583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80583_01 - QinetiQ|| GSID|C80632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80632_01 - MOD|| GSID|C80648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80648_01 - BAE SYSTEMS AUSTRALIA LIMITED|| GSID|C80658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80658_01 - IIS DT|| GSID|C80667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80667_01 - Army/Space & Missile Defense Command (SMDC)|| GSID|C80701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80701_01 - HMG15|| GSID|C80720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80720_01 - Army/Redstone Arsenal|| GSID|C80810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80810_01 - Army/Communications-Electronics Command (CECOM)|| GSID|C81283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81283_01 - LockheedMartinCorporation|| GSID|C81303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81303_01 - MinisteriodelInteriorSecretariadelEstadoSeg.|| GSID|C81444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81444_01 - Admiral|| GSID|C39999_33|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C39999_33 - Other Sub Sector GSID|| GSID|C80657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80657_01 - GMV SA|| GSID|C80657_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80657_02 - GMV SA|| GSID|C81483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81483_01 - DHS/Customs and Border Protection (CBP)|| GSID|C81484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81484_01 - USAF - Air Force, Department of|| GSID|C81524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81524_01 - Office of Secretary of Defense|| GSID|C31812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31812_01 - Army/Information Technology Agency (ITA)|| GSID|C60269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C60269_01 - FM - Forsvarsmakten|| GSID|C60270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C60270_01 - FMV - Forsvarets materielverk|| GSID|C80392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80392_01 - DOD/National Geospatial-Intelligence Agency (NGA)|| GSID|C80472_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80472_02 - United Technologies Corporation|| GSID|C80537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80537_01 - GCHQ|| GSID|C80558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80558_01 - Lockheed_Martin|| GSID|C80663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80663_01 - DHS/Immigration & Customs Enforcement (ICE)|| GSID|C80663_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80663_02 - DHS/Immigration & Customs Enforcement (ICE)|| GSID|C80728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80728_01 - SRA International, Inc|| GSID|C80746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80746_01 - USMC/Training and Education Command (TECOM)|| GSID|C80778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80778_01 - DOJ/JMD/US Marshals Service (USMS)|| GSID|C80785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80785_01 - Intel/Defense & Army Other|| GSID|C80791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80791_01 - CAN DND ADM(IM)|| GSID|C80908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80908_01 - BABCOCK INTEGRATED TECHNOLOGY|| GSID|C81101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81101_01 - HMG10|| GSID|C81103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81103_01 - HMG12|| GSID|C81108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81108_01 - HMG4|| GSID|C81111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81111_01 - HMG7|| GSID|C81112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81112_01 - HMG9|| GSID|C81121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81121_01 - LAInternational|| GSID|C81158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81158_01 - CAN ? DND JOINT|| GSID|C81160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81160_01 - Navy/SPAWAR Systems Center - Pacific (SSC)|| GSID|C81279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81279_01 - Navy/NAVSEA|| GSID|C81354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81354_01 - CNES|| GSID|C81406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81406_01 - Lockheed Martin Corporation|| GSID|C30923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30923_01 - SDDC - Surface Deployment and Distribution Command|| GSID|C31076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31076_01 - Unysis|| GSID|C31077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31077_01 - Customer Test - do not use|| GSID|C31078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31078_01 - Customer Test - do not use|| GSID|C31156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31156_01 - Department of Defense - BTA|| GSID|C31201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31201_01 - Army Installation Management Command|| GSID|C31207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31207_01 - CIA - Central Intelligence Agency|| GSID|C31215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31215_01 - National Security Agency|| GSID|C31217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31217_01 - Naval Surface Warfare Center|| GSID|C31236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31236_01 - Department of Homeland Security - CBP|| GSID|C31237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31237_01 - Department of Homeland Security - ICE|| GSID|C31238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31238_01 - Department of Homeland Security - USCG|| GSID|C31239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31239_01 - Department of Homeland Security - USCIS|| GSID|C31322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31322_01 - Defense, Department of - OSD|| GSID|C31514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31514_01 - Ministerio da Defesa Nacional|| GSID|C31378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31378_01 - Defence|| GSID|C50505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C50505_01 - Pratt and Whitney Canada|| GSID|C50737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C50737_01 - Signalisation SAIC|| GSID|C30604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30604_01 - CACI|| GSID|C60268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C60268_01 - Defence|| GSID|C81357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81357_01 - ATKINS Global|| GSID|C31427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31427_01 - Fortifikationsverket|| GSID|C31091_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31091_02 - Naval Air Systems Command (NAVAIR)|| GSID|C81483_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81483_02 - DHS - Department of Homeland Security|| GSID|C80746_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80746_02 - USMC/Training and Education Command (TECOM)|| GSID|C31138_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31138_03 - Navy, Department of|| GSID|C31199_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31199_02 - Army - Department of Army|| GSID|C81713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81713_01 - Skynet|| GSID|C81750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81750_01 - C81750_01 - Navy/Navy Recruiting Command|| GSID|C81766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81766_01 - Rolls-Royce Marine AS|| GSID|C81811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81811_01 - Ministry of Defence|| GSID|C81815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81815_01 - NATO|| GSID|C30723_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C30723_04 - USAF - Air Force, Department of|| GSID|C81888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81888_01 - DND ? BARK|| GSID|C81940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81940_01 - DOT/Maritime Administration (MARAD)|| GSID|C80391_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C80391_02 - CACI|| GSID|C81961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81961_01 - Defense, Department of - Other Defense Agencies|| GSID|C81984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81984_01 - Navy/SPAWAR Systems Center - Pacific (SSC)|| GSID|C81985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81985_01 - Navy/SPAWAR Systems Center - Atlantic (SSC)|| GSID|C81986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81986_01 - Navy/Commander Operational Test&Eval Force (COTF)|| GSID|C82432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C82432_01 - Pikes Peak Ltd|| GSID|C82526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C82526_01 - ATLAS ELEKTRONIK GmbH|| GSID|C82540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C82540_01 - Defence|| GSID|C82863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C82863_01 - National Defence Headquarters|| GSID|C82873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C82873_01 - DND - PeopleSoft ERP|| GSID|C83090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C83090_01 - Microsoft|| GSID|C83114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C83114_01 - WinMagic Inc.|| GSID|C83133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C83133_01 - PWGSC - IPS - STREAM 1|| GSID|C31136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C31136_01 - RDDC Valcartier|| GSID|C83845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C83845_01 - DEFENSE LOGISTICS AGCY|| GSID|C84297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C84297_01 - DSTL|| GSID|C84341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C84341_01 - DSTL|| Space_Defense_and_Intelligence|GSII|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| GSII|C39999_34|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSII_Att|C39999_34 - Other Sub Sector GSII|| GSII|C81547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSII_Att|C81547_01 - CAN - Canadian Security Intelligence Services|| Sectors|Health|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Healthcare|| Health|HHHP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| HHHP|C10978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C10978_01 - FutureHealth DB-JV|| HHHP|C10978_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C10978_02 - FutureHealth DB-JV|| HHHP|C22294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C22294_01 - CLINICA ONCOCARE|| HHHP|C31463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C31463_01 - JUSTICE HEALTH|| HHHP|C40004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40004_01 - Exempla Healthcare|| HHHP|C40004_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40004_02 - Exempla Healthcare, Denver, CO|| HHHP|C40004_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40004_03 - Exempla Healthcare, Denver, CO|| HHHP|C40005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40005_01 - Beam Partners LLC|| HHHP|C40015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40015_01 - Davita Inc.|| HHHP|C40015_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40015_02 - DaVita Inc. (Torrance, CA)|| HHHP|C40015_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40015_03 - DaVita Inc. (Torrance, CA)|| HHHP|C40016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40016_01 - DentaQuest|| HHHP|C40024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40024_01 - Nebraska Methodist Healthcare|| HHHP|C40024_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40024_02 - Nebraska Methodist Healthcare|| HHHP|C40024_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40024_03 - Nebraska Methodist Healthcare|| HHHP|C40028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40028_01 - St-Vincent Indianapolis|| HHHP|C40028_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40028_02 - St-Vincent Indianapolis|| HHHP|C40028_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40028_03 - St-Vincent Indianapolis|| HHHP|C40029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40029_01 - St-Vincent's Hospital|| HHHP|C40029_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40029_02 - St-Vincent's Hospital|| HHHP|C40029_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40029_03 - St-Vincent's Hospital|| HHHP|C40034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40034_01 - Health Research Inc.|| HHHP|C40037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40037_01 - Schering-Plough|| HHHP|C40038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40038_01 - St-Michael's Hospital|| HHHP|C40038_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40038_02 - St-Michael's Hospital|| HHHP|C40038_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40038_03 - St-Michael's Hospital|| HHHP|C40044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40044_01 - ADRLSSSS de Montreal|| HHHP|C40047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40047_01 - ASSS Capitale Nationale|| HHHP|C40048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40048_01 - ASSS Montréal|| HHHP|C40048_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40048_02 - ASSS Montreal|| HHHP|C40050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40050_01 - Centre hospitalier Angrignon|| HHHP|C40053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40053_01 - Alberta Health Services|| HHHP|C40053_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40053_02 - Alberta Health Services|| HHHP|C40055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40055_01 - Centre Hospitalier Universitaire de l'Estrie|| HHHP|C40056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40056_01 - Chrildren Hospital of Eastern Ontario|| HHHP|C40057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40057_01 - College of Physicians and Surgeons|| HHHP|C40058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40058_01 - CRAG|| HHHP|C40059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40059_01 - CIUSSS Mauricie-Centre-Québec|| HHHP|C40061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40061_01 - CSSS Ahuntsic-Montreal-Nord|| HHHP|C40063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40063_01 - CSSS de la Montagne|| HHHP|C40064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40064_01 - CSSS LaSalle|| HHHP|C40065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40065_01 - CSSS Ouest de l'Ile|| HHHP|C40066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40066_01 - CSSS Coeur de l'Ile|| HHHP|C40068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40068_01 - CSSS Sud-Ouest-Verdun|| HHHP|C40069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40069_01 - CSSS Lucille-Teasdale|| HHHP|C40070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40070_01 - CSSS Trois-Rivieres|| HHHP|C40070_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40070_02 - CSSS Trois-Rivieres|| HHHP|C40073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40073_01 - Hopital du Sacre-Coeur de Montreal|| HHHP|C40074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40074_01 - Hopital Maisonneuve-Rosemont|| HHHP|C40075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40075_01 - Hamilton Health Sciences|| HHHP|C40075_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40075_02 - Hamilton Health Sciences|| HHHP|C40075_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40075_03 - Hamilton Health Sciences|| HHHP|C40075_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40075_04 - Hamilton Health Sciences|| HHHP|C40076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40076_01 - Health Canada|| HHHP|C40077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40077_01 - Hema-Quebec|| HHHP|C40078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40078_01 - I Care Services Ltd|| HHHP|C40086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40086_01 - Ontario Telemedecine Network|| HHHP|C40086_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40086_02 - Ontario Telemedecine Network|| HHHP|C40087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40087_01 - Ottawa Heart Institute Research Corp|| HHHP|C40095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40095_01 - Techno Conseil|| HHHP|C40097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40097_01 - University Health Network|| HHHP|C40098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40098_01 - Urgences-sante|| HHHP|C40143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40143_01 - HMA Three Rivers Reg Med Ctr|| HHHP|C40144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40144_01 - HMA Twin Rivers Reg Med Ctr|| HHHP|C40145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40145_01 - Missouri Hospitals - Litigation|| HHHP|C40150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40150_01 - Tenet Healthcare|| HHHP|C40160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40160_01 - CSSS Chicoutimi|| HHHP|C40161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40161_01 - CSSS Dorval-Lachine-Lasalle|| HHHP|C40162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40162_01 - CSSS Pointe-de-l'Ile|| HHHP|C40164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40164_01 - River Valley Health|| HHHP|C40167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40167_01 - Centre Hospitalier Universitaire de Sherbrooke|| HHHP|C40169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40169_01 - CSSS Montmagny-L'Islet|| HHHP|C40173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40173_01 - Baptist Health South Florida, Miami, FL|| HHHP|C40173_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40173_02 - Baptist Health South Florida, Miami, FL|| HHHP|C40173_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40173_03 - Baptist Health South Florida, Miami, FL|| HHHP|C40175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40175_01 - Provincial Health Services Authority|| HHHP|C40177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40177_01 - Greenville Hospital System|| HHHP|C40177_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40177_02 - Greenville Hospital System|| HHHP|C40177_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40177_03 - Greenville Hospital System|| HHHP|C40178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40178_01 - University of Medicine and Dentistry of NJ|| HHHP|C40178_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40178_02 - University of Medicine and Dentistry of NJ|| HHHP|C40178_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40178_03 - University of Medicine and Dentistry of NJ|| HHHP|C40178_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40178_04 - University of Medicine and Dentistry of NJ|| HHHP|C40179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40179_01 - Wishard Health Services|| HHHP|C40179_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40179_02 - Wishard Health Services, Indianapolis, IN|| HHHP|C40179_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40179_03 - Wishard Health Services, Indianapolis, IN|| HHHP|C40180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40180_01 - Mohawk Supply Chain Services|| HHHP|C40181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40181_01 - Memorial Hermann Healthcare System (Houston, TX)|| HHHP|C40181_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40181_02 - Memorial Hermann Healthcare System (Houston, TX)|| HHHP|C40181_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40181_03 - Memorial Hermann Healthcare System (Houston, TX)|| HHHP|C40182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40182_01 - Orlando Health (Orlando, FL)|| HHHP|C40182_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40182_02 - Orlando Health (Orlando, FL)|| HHHP|C40182_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40182_03 - Orlando Health (Orlando, FL)|| HHHP|C40184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40184_01 - Sunnybrook Health Science Centre|| HHHP|C40184_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40184_02 - Sunnybrook & Women?s College Health Sciences Centr|| HHHP|C40184_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40184_03 - Sunnybrook Health Sciences Centre|| HHHP|C40186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40186_01 - Carillion Health System (Roanoke, VA)|| HHHP|C40186_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40186_02 - Carillion Health System|| HHHP|C40186_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40186_03 - Carillion Health System|| HHHP|C40187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40187_01 - Medical Center of Central Georgia (Macon, GA)|| HHHP|C40187_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40187_02 - Medical Center of Central Georgia (Macon, GA)|| HHHP|C40187_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40187_03 - Medical Center of Central Georgia (Macon, GA)|| HHHP|C40188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40188_01 - CSSS Jonquiere|| HHHP|C40189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40189_01 - ASSS Saguenay-Lac-Saint-Jean|| HHHP|C40190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40190_01 - ASSS Monteregie|| HHHP|C40191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40191_01 - C.D.M.V. Inc.|| HHHP|C40192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40192_01 - Community Hospitals of Indiana|| HHHP|C40192_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40192_02 - Community Hospitals of Indiana|| HHHP|C40193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40193_01 - IWK Grace Health Centre Foundation|| HHHP|C40195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40195_01 - CHUM - Centre Hospitalier de l'Universite de Montreal|| HHHP|C40195_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40195_02 - CHUM - Centre Hospitalier de l'Université de Montréal|| HHHP|C40197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40197_01 - Covenant Health, Knoxville, TN|| HHHP|C40197_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40197_02 - Covenant Health, Knoxville, TN|| HHHP|C40198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40198_01 - Martha Jefferson Hospital, Charlottesvile, VA|| HHHP|C40199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40199_01 - Suburban Hospital Healthcare System, Bethesda, MD|| HHHP|C40199_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40199_02 - Suburban Hospital Healthcare System, Bethesda, MD|| HHHP|C40200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40200_01 - Wellington-Dufferin-Guelph Public Health|| HHHP|C40201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40201_01 - DeKalb Medical Center, Decatur, GA|| HHHP|C40201_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40201_02 - DeKalb Medical Center, Decatur, GA|| HHHP|C40202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40202_01 - Elmhurst Memorial Healthcare, Elmhurst, IL|| HHHP|C40202_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40202_02 - Elmhurst Memorial Healthcare, Elmhurst, IL|| HHHP|C40203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40203_01 - Orlando Health, Orlando, FL|| HHHP|C40204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40204_01 - Medisys|| HHHP|C40206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40206_01 - Health Management Associates, Naples, FL|| HHHP|C40206_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40206_02 - Health Management Associates, Naples, FL|| HHHP|C40207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40207_01 - Jewish Hospital and St. Mary's HealthCare,KY|| HHHP|C40207_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40207_02 - Jewish Hospital and St. Mary's HealthCare,KY|| HHHP|C40208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40208_01 - Memorial Healthcare System, Hollywood, FL|| HHHP|C40208_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40208_02 - Memorial Healthcare System, Hollywood, FL|| HHHP|C40209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40209_01 - West Penn Allegheny Health System, Pittsburgh, PA|| HHHP|C40209_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40209_02 - West Penn Allegheny Health System, Pittsburgh, PA|| HHHP|C40212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40212_01 - The Queen's Medical Center, Honolulu, HI|| HHHP|C40212_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40212_02 - The Queen's Medical Center, Honolulu, HI|| HHHP|C40213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40213_01 - University Health System San Antonio, TX|| HHHP|C40213_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40213_02 - University Health System San Antonio, TX|| HHHP|C40214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40214_01 - BJC Healthcare|| HHHP|C40214_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40214_02 - BJC Healthcare|| HHHP|C40217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40217_01 - Partners HealthCare System, Boston, MA|| HHHP|C40217_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40217_02 - Partners HealthCare System, Boston, MA|| HHHP|C40218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40218_01 - NYS Health Research, Inc.|| HHHP|C40219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40219_01 - Syscor|| HHHP|C40219_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40219_02 - Syscor|| HHHP|C40219_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40219_03 - Syscor|| HHHP|C40220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40220_01 - CHEO Foundation|| HHHP|C40222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40222_01 - UNC Health Care System, Chapel Hill, NC|| HHHP|C40222_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40222_02 - UNC Health Care System, Chapel Hill, NC|| HHHP|C40223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40223_01 - Clark Memorial Hospital, Jeffersonville, IN|| HHHP|C40223_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40223_02 - Clark Memorial Hospital, Jeffersonville, IN|| HHHP|C40225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40225_01 - Saskatchewan Registered Nurses Association|| HHHP|C40227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40227_01 - Physician Office System Program|| HHHP|C40229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40229_01 - CSSSS Lac St-Jean Est (Alma)|| HHHP|C40230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40230_01 - Clinique de dermatologie esthetique de Montreal|| HHHP|C40232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40232_01 - CSSS de Laval|| HHHP|C40233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40233_01 - Tolbert|| HHHP|C40233_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40233_02 - Tolbert|| HHHP|C40234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40234_01 - Innovative Managed Care Systems Ltd|| HHHP|C40235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40235_01 - Osler Systems|| HHHP|C40239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40239_01 - CSSS Charlevoix|| HHHP|C40240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40240_01 - St. Vincent's Health, Birmingham, AL|| HHHP|C40241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40241_01 - Lakeridge Health Corporation|| HHHP|C40248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40248_01 - Birmingham Children's Hospital|| HHHP|C40257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40257_01 - Hospital district of Helsinki and Uusimaa|| HHHP|C40259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40259_01 - Inera|| HHHP|C40261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40261_01 - Isle of Wight NHS PCT|| HHHP|C40265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40265_01 - Landstinget Dalarna|| HHHP|C40268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40268_01 - Landstinget i Kalmar lan|| HHHP|C40284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40284_01 - NHS Institute For Innovation & Improvement|| HHHP|C40284_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40284_02 - NHS England|| HHHP|C40286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40286_01 - Odense Universitetshospital|| HHHP|C40291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40291_01 - Other - Health|| HHHP|C40293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40293_01 - Other Health|| HHHP|C40294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40294_01 - Others Health|| HHHP|C40295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40295_01 - Pirkanmaan sairaanhoitopiirin kuntayhtyma|| HHHP|C40296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40296_01 - Pohjois-Pohjanmaan SHP:n kuntayhtyma|| HHHP|C40297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40297_01 - Pohjois-Savon SHP:n kuntayhtyma|| HHHP|C40301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40301_01 - Region Midtjylland|| HHHP|C40305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40305_01 - Region Syddanmark|| HHHP|C40307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40307_01 - Saude Hospitais|| HHHP|C40310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40310_01 - South Warwick Nhs Trust|| HHHP|C40317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40317_01 - The Royal Wolverhampton Hospitals Nhs Trust|| HHHP|C40318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40318_01 - UCLH|| HHHP|C40319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40319_01 - Vaasan SHP:n kuntayhtyma|| HHHP|C40320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40320_01 - Vasterbottens lans landsting|| HHHP|C40321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40321_01 - VGR - Vastra Gotalandsregionen|| HHHP|C40387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40387_01 - ActivCare A/S|| HHHP|C40391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40391_01 - Dronning Ingrids Hospital|| HHHP|C40393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40393_01 - Godt Smil Tandlægerne|| HHHP|C40395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40395_01 - Kennedy Centret|| HHHP|C40397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40397_01 - Kræftens Bekæmpelse|| HHHP|C40399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40399_01 - Landssygehuset|| HHHP|C40400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40400_01 - Medicoteknik, Region Syddanmark|| HHHP|C40404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40404_01 - Statens Seruminstitut|| HHHP|C49999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C49999_01 - Other Sub Sector GHHP (old sub-sector)|| HHHP|C31665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C31665_01 - VICTORIAN CYTOLOGY SERVICE INC|| HHHP|C51391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C51391_01 - MedCom|| HHHP|C51432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C51432_01 - Nova Medical|| HHHP|C51985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C51985_01 - Carsten Damgaard and Jørn Johannessen|| HHHP|C52082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C52082_01 - GHX Europe GmbH|| HHHP|C52121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C52121_01 - Ingeborggården|| HHHP|C60191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C60191_01 - LA ESPERANZA DEL PERU SA|| HHHP|C60234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C60234_01 - Womens College Hospital|| HHHP|C60300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C60300_01 - Norrbottens lans landsting|| HHHP|C70475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C70475_01 - SMAS & Municipalities|| HHHP|C81030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81030_01 - Birmingham Children's Hospital Foundatio|| HHHP|C81044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81044_01 - Isle of Wight NHS Trust|| HHHP|C81056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81056_01 - Solent NHS Trust|| HHHP|C81057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81057_01 - SOUTH WARWICK NHS TRUST|| HHHP|C81059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81059_01 - St Helens & Knowsley Teaching Hospitals|| HHHP|C81060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81060_01 - The Royal Wolverhampton Hospitals NHS Tr|| HHHP|C81061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81061_01 - UCLH|| HHHP|C80325_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80325_03 - CAMDEN PCT|| HHHP|C80408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80408_01 - Medical Council Of Canada|| HHHP|C80471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80471_01 - Oklahoma Blood Institute|| HHHP|C80659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80659_01 - Solent NHS Trust|| HHHP|C80691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80691_01 - Canadian Medical Network|| HHHP|C80724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80724_01 - UMDNJ University Hospital|| HHHP|C80730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80730_01 - Clinica la Luz|| HHHP|C80775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80775_01 - Centre Hospitalier De St. Mary's|| HHHP|C81172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81172_01 - The Medical Center of Peach County|| HHHP|C81361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81361_01 - West Hertfordshire Hospitals NHS Trust|| HHHP|C81404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81404_01 - South Essex Partnership Trust|| HHHP|C81433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81433_01 - South London & Maudsley NHS Foundation T|| HHHP|C81437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81437_01 - Clinique medicale Le Trait d'union|| HHHP|C49999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C49999_02 - Other Sub Sector HHHP|| HHHP|C10452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C10452_01 - Strata Health Solutions Inc.|| HHHP|C60226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C60226_01 - Corporation IMS Health, Canada Ltee DBA IMS Brogan|| HHHP|C60227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C60227_01 - Hopitel Inc.|| HHHP|C81519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81519_01 - Hopital General Juif|| HHHP|C81530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81530_01 - MedVirginia|| HHHP|C81539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81539_01 - Capital Region Prostate Center|| HHHP|C20460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C20460_01 - Plexus|| HHHP|C40002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40002_01 - Carespark|| HHHP|C40003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40003_01 - Christians Hospital|| HHHP|C40006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40006_01 - Scottish Rite Hospital|| HHHP|C40007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40007_01 - Baptist Hospital Miami|| HHHP|C40010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40010_01 - Clark Memorial Hospital|| HHHP|C40017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40017_01 - Elmhurst Memorial Services|| HHHP|C40018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40018_01 - TechnoConseil inc.|| HHHP|C40019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40019_01 - Jewish Hospital Healthcare|| HHHP|C40020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40020_01 - Lancaster General Hospital|| HHHP|C40023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40023_01 - Memorial Hospital|| HHHP|C40023_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40023_02 - Memorial Hospital|| HHHP|C40039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40039_01 - Laboratoires de la retine RD|| HHHP|C40043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40043_01 - 32 Soft Inc|| HHHP|C40045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40045_01 - Brantford General Hospital|| HHHP|C40049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40049_01 - Beauvais Truchon, s.e.n.c.|| HHHP|C40051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40051_01 - Centre hospitalier Anna-Laberge|| HHHP|C40062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40062_01 - CSSS Gatineau|| HHHP|C40062_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40062_02 - CSSS Gatineau|| HHHP|C40067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40067_01 - CSSS Grand littoral|| HHHP|C40072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40072_01 - Hopital Douglas|| HHHP|C40080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40080_01 - Kingston General Hospital|| HHHP|C40083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40083_01 - North Simcoe Muskoka PTP|| HHHP|C40084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40084_01 - Omni-Med.com Inc.|| HHHP|C40092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40092_01 - Science applications international|| HHHP|C40099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40099_01 - Versacare Orilla - Oak Terrace|| HHHP|C40101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40101_01 - ITR Laboratoires|| HHHP|C40102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40102_01 - Victoria Hospice Society|| HHHP|C40103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40103_01 - Lutheran Medical Center|| HHHP|C40112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40112_01 - Metcare|| HHHP|C40118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40118_01 - NB Dept. Family and Community Services|| HHHP|C40125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40125_01 - Colchester East Hants Health Authority|| HHHP|C40131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40131_01 - MUHC - MHWGll University Health Center|| HHHP|C40132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40132_01 - Advocate Health Care|| HHHP|C40133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40133_01 - Alexian Brothers Hospital|| HHHP|C40137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40137_01 - BCBS of Michigan|| HHHP|C40139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40139_01 - BCBS of NE PA|| HHHP|C40141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40141_01 - Centerpointe Hospital|| HHHP|C40142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40142_01 - Highlands of Wellmont|| HHHP|C40146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40146_01 - Oklahoma Hospital Groups|| HHHP|C40147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40147_01 - Sentara|| HHHP|C40148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40148_01 - Southern Illinois Healthcare|| HHHP|C40149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40149_01 - St-Anthony's Medical Center|| HHHP|C40151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40151_01 - Walgreen Company|| HHHP|C40152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40152_01 - CSSS Vieille Capitale|| HHHP|C40154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40154_01 - Good Samaritan Society|| HHHP|C40157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40157_01 - CSSS Becancour-Nicolet-Yamaska|| HHHP|C40158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40158_01 - CSSS de l'energie|| HHHP|C40166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40166_01 - Centre Hospitalier de St-Mary|| HHHP|C40168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40168_01 - UPMC|| HHHP|C40170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40170_01 - CSSS Vallee-de-la-Batiscan|| HHHP|C40171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40171_01 - CSSS Drummond|| HHHP|C40172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40172_01 - Clinique medicale Mellon|| HHHP|C40174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40174_01 - CSSS Pierre-Boucher|| HHHP|C40176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40176_01 - Saint Louis University Hospital|| HHHP|C40183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40183_01 - University General Hospital (Houston, TX)|| HHHP|C40183_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40183_02 - University General Hospital|| HHHP|C40194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40194_01 - ASSS Outaouais|| HHHP|C40196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40196_01 - Med Assets Inc.|| HHHP|C40197_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40197_03 - Covenant Health|| HHHP|C40210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40210_01 - Commonwealth Health Corporation|| HHHP|C40215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40215_01 - Centre hospitalier regional de Trois-Rivieres|| HHHP|C40221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40221_01 - OSF Healthcare System, Peoria, IL|| HHHP|C40221_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40221_02 - OSF Healthcare System, Peoria, IL|| HHHP|C40224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40224_01 - Lancaster General Hospital, Lancaster, PA|| HHHP|C40226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40226_01 - Royal College of Physicians and Surgeons of Canada|| HHHP|C40228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40228_01 - Centre expertise en sante de Sherbrooke|| HHHP|C40231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40231_01 - UMass Memorial Medical Center|| HHHP|C40238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40238_01 - Innovative Managed Care Systems Ltd|| HHHP|C40288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40288_01 - Other - Health|| HHHP|C40289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40289_01 - Other - Health|| HHHP|C40290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40290_01 - Other - Health|| HHHP|C40292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40292_01 - Other ? Health|| HHHP|C40329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40329_01 - Nueva Empresa Promotora De Salud (Nueva EPS)|| HHHP|C40385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40385_01 - ONCOCARE SRL|| HHHP|C51122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C51122_01 - Amersham Biosciences|| HHHP|C51749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C51749_01 - Amersham Biosciences|| HHHP|C51793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C51793_01 - Nova Medical|| HHHP|C60179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C60179_01 - Clinica Ricardo Palma S.A.|| HHHP|C80286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80286_01 - Champlain Community Care Access Centre|| HHHP|C80325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80325_01 - CAMDEN PCT|| HHHP|C80325_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80325_02 - CAMDEN PCT|| HHHP|C80683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80683_01 - Arcadia Solutions, LLC|| HHHP|C80817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80817_01 - Woodstock General Hospital Trust|| HHHP|C80997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C80997_01 - UCLH NHS Trust|| HHHP|C81040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81040_01 - HCA INTERNATIONAL LTD|| HHHP|C81041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81041_01 - HEALTH MANAGEMENT (UCLH) PLC|| HHHP|C81050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81050_01 - QS Enterprises|| HHHP|C81062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81062_01 - UNIVERSITY COLLEGE LONDON HOSPITALS|| HHHP|C81293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81293_01 - ConemaughHealthSystems|| HHHP|C81383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81383_01 - Groupe Santé Medisys S.E.C.|| HHHP|C40308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C40308_01 - Sjukvardsradgivningen SVR AB|| HHHP|C81549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81549_01 - I Care Services - Gimbel Eye Centre|| HHHP|C81562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81562_01 - Reseau de cancerologie Rossy|| HHHP|C81583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81583_01 - BLUEWATER HEALTH|| HHHP|C81595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81595_01 - Hema-Quebec|| HHHP|C81602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81602_01 - Ingenio|| HHHP|C81633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81633_01 - Herlev Hospital|| HHHP|C81656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81656_01 - Fonden For Tidsskrift for Praktisk|| HHHP|C81629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81629_01 - Rigshospitalet|| HHHP|C81706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81706_01 - Vancouver Island Health Authority (VIHA)|| HHHP|C81714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81714_01 - ACT Health|| HHHP|C81719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81719_01 - Eastern Health|| HHHP|C81915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81915_01 - Corporation d'Urgences-Sante, La|| HHHP|C81937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81937_01 - Eskenazi Health Center, Inc|| HHHP|C81970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81970_01 - Leidos Health|| HHHP|C81989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81989_01 - H?pital G?n?ral de Hawkesbury|| HHHP|C81990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C81990_01 - Groupe Sant? Medisys S.E.C.|| HHHP|C82039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82039_01 - Tufts Medical Center|| HHHP|C82119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82119_01 - Carema �ldreomsorg AB|| HHHP|C82128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82128_01 - Landstinget S�rmland|| HHHP|C82157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82157_01 - NAVICENT HEALTH|| HHHP|C82168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82168_01 - ST. MICHAELS HOSPITAL|| HHHP|C82206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82206_01 - Diacor terveyspalvelut Oy|| HHHP|C82209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82209_01 - Forssan seudun hyvinvointikunt|| HHHP|C82235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82235_01 - Suomen Punainen Risti-Finlands|| HHHP|C82348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82348_01 - 3SHealth|| HHHP|C82372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82372_01 - NEBRASKA METHODIST HTH|| HHHP|C82373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82373_01 - Sovera 10 Product Development|| HHHP|C82538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82538_01 - Carilon Clinic|| HHHP|C82547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82547_01 - Carebook Technologies Inc.|| HHHP|C82552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82552_01 - Kindred Healthcare, Inc.|| HHHP|C82557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82557_01 - Heilig Hartziekenhuis - Lier|| HHHP|C82575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82575_01 - DAVITA INC|| HHHP|C82626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82626_01 - University Hospital|| HHHP|C82645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82645_01 - Jewish Hospital|| HHHP|C82646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82646_01 - NAVICENT HEALTH|| HHHP|C82649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82649_01 - H&HC d/b/a Eskenazi Health|| HHHP|C82700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82700_01 - Kindred Healthcare, Inc.|| HHHP|C82725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82725_01 - GREENVILLE HOSPITAL SYS|| HHHP|C82726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82726_01 - Carilion Clinic|| HHHP|C82727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82727_01 - MARTHA JEFFERSON HOSPITAL|| HHHP|C82728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82728_01 - SUBURBAN HOSPITAL|| HHHP|C82729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82729_01 - UNC HOSPITALS|| HHHP|C82730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82730_01 - ALLEGHENY HEALTH NETWORK|| HHHP|C82812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82812_01 - UNIVERSITY OF NORTH CAROLINA HEALTH CARE|| HHHP|C82849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82849_01 - Rouge Valley Health System|| HHHP|C82856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82856_01 - SIDIIEF|| HHHP|C82858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82858_01 - Society for Reproductive Investigation|| HHHP|C82889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82889_01 - HC-PVR-UNCHOSPITALS|| HHHP|C82891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82891_01 - COMMUNITYHOSPITALIND|| HHHP|C82892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82892_01 - COVENANTHEALTHSYSTEM|| HHHP|C82898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82898_01 - WESTPENNALLEGHANYHLT|| HHHP|C82901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82901_01 - DEKALBMEDICALCENTER|| HHHP|C82905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82905_01 - CARILIONHEALTHSYSTEMS(ROANOKE,VACITY)|| HHHP|C82908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82908_01 - HC-PVR-OSFHEALTHCARE|| HHHP|C82909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82909_01 - COMMONWEALTHHEALTH|| HHHP|C82912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82912_01 - HENNEPINCOUNTYMEDICALCENTER|| HHHP|C82913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82913_01 - UNIVERSITYHEALTHSYSTEMS|| HHHP|C82915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82915_01 - HEALTHMANAGEMENTASSOCIATES|| HHHP|C82921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82921_01 - MARTHAJEFFERSONHOSPITAL|| HHHP|C82957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C82957_01 - UNIVOFMED/DENTISTNJ|| HHHP|C83001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83001_01 - Ordre des dentistes du Qu�bec|| HHHP|C83004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83004_01 - IUCPQ - Inst. universit. card. & pneum. de Qu�bec|| HHHP|C83030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83030_01 - Clark Memorial Hospital, Jeffersonville, IN|| HHHP|C83018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83018_01 - IMS Health Canada Inc|| HHHP|C83037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83037_01 - The Queen's Medical Center|| HHHP|C83046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83046_01 - London North West Healthcare NHS Trust|| HHHP|C83068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83068_01 - CAN/QC - CISSS Laval|| HHHP|C83070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83070_01 - Montfort Hospital|| HHHP|C83072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83072_01 - Orillia Soldiers' Memorial Hospital|| HHHP|C83079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83079_01 - Health Management Associates, Naples, FL|| HHHP|C83081_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83081_01 - C49999_02 - Other Sub Sector HHHP|| HHHP|C83081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83081_01 - Other Sub Sector HHHP|| HHHP|C83122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83122_01 - University Health System San Antonio, TX|999| HHHP|C83155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83155_01 - Sisters of Charity of Leavenworth Health System|| HHHP|C83174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83174_01 - Lessebo Kommun|| HHHP|C83202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83202_01 - Praktikertjanst AB|| HHHP|C83208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83208_01 - Kronobergs Lans Landsting|| HHHP|C83234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83234_01 - St-Trudo Ziekenhuis|| HHHP|C83256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83256_01 - Institut de Cardiologie de Montr?al|| HHHP|C83276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83276_01 - Pohjois-Pohjanmaan SHP:n kuntayhtym?|| HHHP|C83277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83277_01 - Pohjois-Pohjanmaan SHP:n kuntayhtym?|| HHHP|C83294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83294_01 - Doctors of BC|| HHHP|C83402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83402_01 - Institut universitaire sant? mentale MTL|| HHHP|C83455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83455_01 - St. Vincent Health, Indianapolis, IN|| HHHP|C83541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83541_01 - UMass Memorial Medical Center|| HHHP|C83618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83618_01 - Other - CA322|| HHHP|C83623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83623_01 - Institut universitaire en sante mentale Montreal|| HHHP|C83626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83626_01 - Biron Groupe Sante Inc|| HHHP|C83633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83633_01 - Leigh-Ann, Health & Production|| HHHP|C83699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83699_01 - State of Nevada Division of Health Care|| HHHP|C83760_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83760_01 - BAPTIST HOSPITAL OF MIAMI|| HHHP|C83825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83825_01 - COMMUNITY HOSPITAL IND|| HHHP|C83844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83844_01 - DAVITA INC|| HHHP|C83846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83846_01 - DEKALB MEDICAL CENTER|| HHHP|C83900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83900_01 - GREENVILLE HOSPITAL SYS|| HHHP|C83963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83963_01 - MARTHA JEFFERSON HOSPITAL|| HHHP|C83971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83971_01 - MEDICAL CTR CENTRAL GA|| HHHP|C83993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83993_01 - NAVICENT HEALTH|| HHHP|C83997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C83997_01 - NEBRASKA METHODIST HTH|| HHHP|C84087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84087_01 - ST. MICHAELS HOSPITAL|| HHHP|C84088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84088_01 - ST. VINCENT HOSPITAL|| HHHP|C84089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84089_01 - ST. VINCENT'S HOSPITAL|| HHHP|C84101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84101_01 - SUBURBAN HOSPITAL|| HHHP|C84120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84120_01 - Texas Scottish Rite Hospital for Childre|| HHHP|C84135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84135_01 - UNC HOSPITALS|| HHHP|C84197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84197_01 - Health Research Inc.|| HHHP|C84242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84242_01 - LifePoint Hospitals|| HHHP|C84303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84303_01 - Vanden Borre|| HHHP|C84328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84328_01 - SpecialtyCare|| HHHP|C84346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84346_01 - Plymouth Hospitals NHS Trust|| HHHP|C84361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84361_01 - West Penn Allegheny Health System|| HHHP|C84366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHHP_Att|C84366_01 - SpecialtyCare|| Health|HHCP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| HHCP|C20778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20778_01 - CarePlus Health Plan|| HHCP|C20781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20781_01 - Excellus|| HHCP|C20786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20786_01 - Healthcare Dist - Plam Beach County|| HHCP|C20787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20787_01 - HealthPlus of Michigan|| HHCP|C20789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20789_01 - Humana|| HHCP|C20789_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20789_02 - Humana|| HHCP|C20789_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20789_03 - Humana|| HHCP|C20791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20791_01 - Optima Health|| HHCP|C20792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20792_01 - Oxford Health Plans|| HHCP|C20795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20795_01 - Rocky Mountain Health Plans|| HHCP|C20797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20797_01 - Sierra Military Health Services|| HHCP|C20800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20800_01 - Wellcare|| HHCP|C20836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20836_01 - HealthNow New York|| HHCP|C20842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20842_01 - Independence Blue Cross|| HHCP|C20853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20853_01 - VHI|| HHCP|C20853_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20853_02 - VHI|| HHCP|C20853_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20853_03 - VHI|| HHCP|C20868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20868_01 - Cigna|| HHCP|C20868_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20868_02 - Cigna|| HHCP|C20868_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20868_03 - Cigna|| HHCP|C20868_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20868_04 - Cigna|| HHCP|C20871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20871_01 - Croix Bleue|| HHCP|C20871_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20871_02 - Croix Bleue|| HHCP|C20871_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20871_03 - Croix Bleue|| HHCP|C20871_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20871_04 - Croix Bleue|| HHCP|C20871_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20871_06 - Croix Bleue|| HHCP|C20871_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20871_07 - Croix Bleue|| HHCP|C20874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20874_01 - Carefirst|| HHCP|C20876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20876_01 - Highmark|| HHCP|C20877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20877_01 - BCBS of Mississippi|| HHCP|C20878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20878_01 - Mountain State BCBS|| HHCP|C20879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20879_01 - BCBS of Alabama|| HHCP|C20879_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20879_02 - BCBS of Alabama|| HHCP|C20879_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20879_03 - BCBS of Alabama|| HHCP|C20881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20881_01 - BCBS of Oklahoma|| HHCP|C20882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20882_01 - Aetna Life|| HHCP|C20882_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20882_02 - Aetna Life|| HHCP|C20882_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20882_03 - Aetna Life|| HHCP|C20889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20889_01 - Premera Blue Cross|| HHCP|C20898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20898_01 - Tufts Health Plan|| HHCP|C21009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21009_01 - Voluntary Health Insurance Board|| HHCP|C21032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21032_01 - XLHealth (Baltimore, MD)|| HHCP|C21032_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21032_02 - XLHealth, Baltimore, MD|| HHCP|C21032_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21032_03 - XLHealth, Baltimore, MD|| HHCP|C21792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21792_01 - FirstCare Health Plans|| HHCP|C21799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21799_01 - Axis Global Accident and Health|| HHCP|C21855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21855_01 - Harvard Pilgrim Health Care|| HHCP|C20679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20679_01 - USHealth Group, Inc.|| HHCP|C22240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22240_01 - BICE Vida Compañia de Seguros S.A.|| HHCP|C22339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22339_01 - Hawaii Health Connector|| HHCP|C29999_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C29999_10 - Other Sub Sector FIHC (old sub-sector)|| HHCP|C21932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21932_01 - Global Excel Management Inc.|| HHCP|C22051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22051_01 - Hanse-Merkur Versicherungsgruppe|| HHCP|C22062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22062_01 - Insurance|| HHCP|C22201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22201_01 - Achmea Group|| HHCP|C22205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22205_01 - Other Insurances|| HHCP|C40242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C40242_01 - AOK|| HHCP|C40244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C40244_01 - Barmer GEK|| HHCP|C40327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C40327_01 - Isapre Consalud|| HHCP|C40328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C40328_01 - Isapre Cruz Blanca S.A.|| HHCP|C51733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C51733_01 - Blue Cross Blue Shield of Alabama|| HHCP|C60320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C60320_01 - ASISA S.A.|| HHCP|C80250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C80250_01 - CAREFIRST|| HHCP|C80709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C80709_01 - GetInsured|| HHCP|C81218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C81218_01 - Kaiser Permanente|| HHCP|C81298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C81298_01 - JohnstonGroupInc.|| HHCP|C81385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C81385_01 - ESI Canada oa Express Scripts Canada|| HHCP|C81412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C81412_01 - Union pois-ov-a a.s.|| HHCP|C49999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C49999_03 - Other Sub Sector HHCP|| HHCP|C22125_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22125_03 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| HHCP|C22125_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22125_11 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| HHCP|C22125_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22125_12 - OTHERS ACCOUNTS - INSURANCE ON HEALTH AND RETIREMENT|| HHCP|C81474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C81474_01 - USF Insurance|| HHCP|C20114_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20114_02 - Carefirst BlueCross Blue Shield|| HHCP|C20376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20376_01 - Medavie Blue Cross|| HHCP|C20376_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20376_02 - Medavie Blue Cross|| HHCP|C20643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20643_01 - Medco|| HHCP|C20643_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20643_02 - Medco Health Solution Inc|| HHCP|C20777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20777_01 - Aveta|| HHCP|C20779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20779_01 - CarePlus of Humana|| HHCP|C20780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20780_01 - Cariten|| HHCP|C20784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20784_01 - Health America|| HHCP|C20785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20785_01 - Health Plan of Nevada|| HHCP|C20788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20788_01 - Health America|| HHCP|C20790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20790_01 - KS Health|| HHCP|C20793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20793_01 - Physicians Union Plan|| HHCP|C20794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20794_01 - Qualchoice|| HHCP|C20796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20796_01 - Schaller Anderson|| HHCP|C20798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20798_01 - Unity Health Plans|| HHCP|C20799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20799_01 - Washington State Health Insurance|| HHCP|C20875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20875_01 - BCBS of Tennessee|| HHCP|C20880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C20880_01 - BCBS of NC|| HHCP|C21022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21022_01 - BCBS of Arkansas|| HHCP|C21130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21130_01 - Health Now|| HHCP|C21131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21131_01 - Regence|| HHCP|C21140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21140_01 - KMG America|| HHCP|C21787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21787_01 - GroupHEALTH Global Partners Inc.|| HHCP|C21809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21809_01 - Geisinger Health Plan|| HHCP|C21810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21810_01 - HI - University Health Alliance|| HHCP|C21811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21811_01 - Passport Health Communication Inc.|| HHCP|C21819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21819_01 - MMO|| HHCP|C21849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21849_01 - Mountain State Blue Cross Blue Shield|| HHCP|C21887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C21887_01 - Blue Cross and Blue Shield of TN|| HHCP|C22189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22189_01 - Victoria Seguros|| HHCP|C22273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22273_01 - Mercantil, C.A. , Banco Universal|| HHCP|C22341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22341_01 - Blue Cross of Northeastern Pennsylvania|| HHCP|C22342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C22342_01 - Sierra Health Services, Inc.|| HHCP|C40211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C40211_01 - HI - University Health Alliance|| HHCP|C40364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C40364_01 - Insurance|| HHCP|C80985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C80985_01 - Sterling Insurance Group|| HHCP|C11183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C11183_01 - CO Medicaid - RAC|| HHCP|C81983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C81983_01 - Blue Cross Blue Shield of Oklahoma|| HHCP|C81997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81997_01 - Highmark Inc.|| HHCP|C82226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C82226_01 - Pohjantähti Keskinäinen Vaku|| HHCP|C82510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C82510_01 - VGZ|| HHCP|C82650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C82650_01 - UnitedHealthcare, Inc.|| HHCP|C82803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C82803_01 - USF INSURANCE COMPANY|| HHCP|C82806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C82806_01 - USHEALTH Group Inc|| HHCP|C82811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C82811_01 - XLHEALTH CORPORATION|| HHCP|C82831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C82831_01 - AVANT INSURANCE LIMITED|| HHCP|C83031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83031_01 - Xlhealth-Bipa, Inc., Baltimore, MD|| HHCP|C83099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83099_01 - NATIONAL DISABILITY INSURANCE AGENCY|| HHCP|C83156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83156_01 - Group Health Cooperative|| HHCP|C83296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83296_01 - Case Management|| HHCP|C83303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83303_01 - Kivipuiston palvelukoti Oy|| HHCP|C83305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83305_01 - Kivipuiston palvelukoti Oy|| HHCP|C83377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83377_01 - Multiclient - Healthcare|| HHCP|C83396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83396_01 - MEMORIAL HEALTHCARE SYSTEM|| HHCP|C83639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83639_01 - Vancouver Island Health Authority|| HHCP|C83656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83656_01 - NYC Dist. Council of Carpenters Benefits|| HHCP|C83705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83705_01 - Connect for Health Colorado|| HHCP|C83771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83771_01 - Blue Cross Blue Shield of Alabama|| HHCP|C83788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83788_01 - CARILION HEALTH SYSTEMS|| HHCP|C83822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83822_01 - COMMONWEALTH HEALTH|| HHCP|C83830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83830_01 - COVENANT HEALTH SYSTEM|| HHCP|C83875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83875_01 - EXEMPLA HEALTHCARE|| HHCP|C83908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83908_01 - HAMILTON HLTH SCN|| HHCP|C83972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C83972_01 - Medicare Secondary Payer Commercial Repa|| HHCP|C84016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C84016_01 - OSF HEALTHCARE|| HHCP|C84138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C84138_01 - United Healthcare Services, Inc.|| HHCP|C84142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C84142_01 - UNIVERSITY HEALTH SYSTEM|| HHCP|C84144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C84144_01 - Valence Health,Inc.|| HHCP|C84167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C84167_01 - WISHARD HEALTH SERVICES|| HHCP|C84172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHCP_Att|C84172_01 - XLHEALTH CORPORATION|| Health|HHLS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| HHLS|C11049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C11049_01 - Laboratoire Atlas Inc.|| HHLS|C11115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C11115_01 - Covance Inc|| HHLS|C22320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C22320_01 - Forex A/S|| HHLS|C31445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C31445_01 - Hjalpmedelscentrum i ostergotland|| HHLS|C31500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C31500_01 - Medical Research Council|| HHLS|C31546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C31546_01 - NHMRC ABN 88 601 010 284|| HHLS|C40247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40247_01 - Biocartis|| HHLS|C40250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40250_01 - Coleg Morgannwg|| HHLS|C40251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40251_01 - Finnish Red Cross, Blood Service|| HHLS|C40253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40253_01 - Health Protection Agency|| HHLS|C40262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40262_01 - Janssen Pharmaceutica|| HHLS|C40266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40266_01 - Landstinget Halland|| HHLS|C40267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40267_01 - Landstinget i Jonkopings lan|| HHLS|C40269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40269_01 - Landstinget i ostergotland|| HHLS|C40270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40270_01 - Landstinget i Uppsala lan|| HHLS|C40271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40271_01 - Landstinget i Varmland|| HHLS|C40272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40272_01 - Landstinget Jamtland|| HHLS|C40273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40273_01 - Landstinget Sormland|| HHLS|C40275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40275_01 - Landstinget Vastmanland|| HHLS|C40276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40276_01 - Lansi-Pohjan sairaanhoitopiirin kuntayhtyma|| HHLS|C40277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40277_01 - Lapin sairaanhoitopiirin kuntayhtyma|| HHLS|C40282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40282_01 - Medbit Oy|| HHLS|C40287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40287_01 - orebro lans landsting|| HHLS|C40302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40302_01 - Region Nordjylland|| HHLS|C40303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40303_01 - Region Sjælland|| HHLS|C40315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40315_01 - Swissmedic|| HHLS|C40316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40316_01 - Sygehus Sønderjylland, Aabenraa|| HHLS|C40331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40331_01 - Code USA - Health & Pharmaceutical|| HHLS|C40386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40386_01 - 3DHISTECH|| HHLS|C40392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40392_01 - GlyCom A/S|| HHLS|C40401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40401_01 - Missionpharma A/S|| HHLS|C40402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40402_01 - NNE Pharmaplan AG|| HHLS|C50006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50006_01 - Abbott Laboratories Limited|| HHLS|C50040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50040_01 - Amgen Inc.|| HHLS|C50040_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50040_02 - Amgen Inc.|| HHLS|C50040_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50040_03 - Amgen, Inc.|| HHLS|C50140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50140_01 - Cardinal Health|| HHLS|C50140_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50140_02 - Cardinal Health|| HHLS|C31660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C31660_01 - Universiteten|| HHLS|C51218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51218_01 - Croda|| HHLS|C51338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51338_01 - Johnson & Johnson|| HHLS|C51361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51361_01 - Kronans droghandel|| HHLS|C51364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51364_01 - La Roche|| HHLS|C51394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51394_01 - Merck|| HHLS|C51395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51395_01 - Merck|| HHLS|C51396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51396_01 - Merck|| HHLS|C51397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51397_01 - MERCK Konzern|| HHLS|C51409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51409_01 - MSD Sharp & Dohme|| HHLS|C51414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51414_01 - Mylan|| HHLS|C51433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51433_01 - Novartis|| HHLS|C51434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51434_01 - Novo Nordisk A/S|| HHLS|C51435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51435_01 - Novozymes A/S|| HHLS|C51436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51436_01 - Office Cherifien des Phosphates|| HHLS|C51441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51441_01 - ORICA AUSTRALIA|| HHLS|C50282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50282_01 - Gencor - The Genetics Corporation|| HHLS|C50410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50410_01 - Merck Frosst Canada Ltee|| HHLS|C50468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50468_01 - Paragon Orthotic Laboratory|| HHLS|C50491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50491_01 - Pfizer Canada Inc.|| HHLS|C50491_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50491_02 - Pfizer Canada Inc.|| HHLS|C50491_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50491_04 - Pfizer Canada Inc.|| HHLS|C50492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50492_01 - Pharmascience|| HHLS|C50492_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50492_02 - Pharmascience|| HHLS|C50532_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50532_02 - Halo Pharmaceutical Canada Inc|| HHLS|C50532_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50532_03 - Ratiopharm|| HHLS|C50567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50567_01 - Sanofi-Aventis Inc.|| HHLS|C50878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50878_01 - 2CSI|| HHLS|C50932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50932_01 - Aptalis Pharma Canada|| HHLS|C50984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50984_01 - Teva Neuroscience Canada|| HHLS|C51104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51104_01 - Abbott|| HHLS|C51116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51116_01 - Akzo Nobel|| HHLS|C51127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51127_01 - Apoteksgruppen|| HHLS|C51137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51137_01 - AstraZeneca|| HHLS|C51176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51176_01 - Boehringer Ingelheim Pharma GmbH & Co. KG|| HHLS|C51633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51633_01 - Tikkurila Oyj|| HHLS|C51648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51648_01 - Trelleborg|| HHLS|C51915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51915_01 - Abacus Medicine A/S|| HHLS|C51916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51916_01 - Actavis A/S|| HHLS|C51919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51919_01 - Agora Trading Aps.|| HHLS|C51925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51925_01 - Ambu A/S|| HHLS|C51933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51933_01 - Axel Madsen A/S|| HHLS|C51941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51941_01 - BHJ A/S|| HHLS|C51993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51993_01 - Chr. Hansen A/S|| HHLS|C52061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52061_01 - Etac A/S|| HHLS|C52078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52078_01 - GandG Danmark A/S|| HHLS|C52106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52106_01 - Holm and Halby|| HHLS|C51484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51484_01 - Pharmaceutical|| HHLS|C51485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51485_01 - Pharmacia|| HHLS|C51534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51534_01 - Sanofi|| HHLS|C51535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_01 - SANOFI AVENTIS|| HHLS|C51535_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_02 - SANOFI AVENTIS|| HHLS|C51535_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_03 - SANOFI AVENTIS|| HHLS|C51535_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_04 - SANOFI AVENTIS|| HHLS|C51535_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_05 - SANOFI AVENTIS|| HHLS|C51535_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_06 - SANOFI AVENTIS|| HHLS|C51535_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_07 - SANOFI AVENTIS|| HHLS|C51535_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_08 - SANOFI AVENTIS|| HHLS|C51535_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_11 - SANOFI AVENTIS|| HHLS|C51535_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_12 - SANOFI AVENTIS|| HHLS|C51550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51550_01 - Schering|| HHLS|C52139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52139_01 - Kemwell AB|| HHLS|C52157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52157_01 - Life Technologies Europe BV|| HHLS|C52180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52180_01 - McNeil AB|| HHLS|C52181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52181_01 - Medical Danmark A/S|| HHLS|C52195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52195_01 - Neurodan A/S|| HHLS|C52196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52196_01 - NeuroSearch A/S|| HHLS|C52205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52205_01 - Nutrimin A/S|| HHLS|C52207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52207_01 - Octapharma AB|| HHLS|C52235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52235_01 - Radiometer Medical A/S|| HHLS|C52245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52245_01 - Roche Diagnostic A/S|| HHLS|C52259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52259_01 - Scanflavour a/s|| HHLS|C52262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52262_01 - Scanoptic Aktiebolag|| HHLS|C52295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52295_01 - Symphogen A/S|| HHLS|C52315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52315_01 - V Guldmann A/S|| HHLS|C52324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52324_01 - Virbac Danmark A/S|| HHLS|C52332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52332_01 - Xellia Pharmaceuticals Aps|| HHLS|C59999_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C59999_04 - Other Sub Sector MMHC (old sub-sector)|| HHLS|C60083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C60083_01 - Shoppers Drug Mart|| HHLS|C60093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C60093_01 - Wheaton Industries|| HHLS|C60129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C60129_01 - Familiprix|| HHLS|C60152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C60152_01 - Quest Diagnostics Inc.|| HHLS|C69999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C69999_02 - Other Sub Sector RRHC (old sub-sector)|| HHLS|C80209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80209_01 - Lifelabs L.P.|| HHLS|C70484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C70484_01 - Svenska Dagbladet|| HHLS|C81045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C81045_01 - MEDICAL RESEARCH COUNCIL|| HHLS|C80402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80402_01 - CIFARMA|| HHLS|C80489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80489_01 - Abbott_Laboratories|| HHLS|C80495_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80495_01 - Animal_Health_&_Veterinary_Laboratories|| HHLS|C80496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80496_01 - Aspen_Healthcare|| HHLS|C80521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80521_01 - Covance|| HHLS|C80598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80598_01 - Takeda_Global|| HHLS|C80661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80661_01 - Bristol Myers|| HHLS|C80672_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80672_01 - Prairie Diagnostic Seed Lab Inc.|| HHLS|C80812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80812_01 - AbbVie Corporation|| HHLS|C81237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C81237_01 - Algorithme Pharma Inc|| HHLS|C49999_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C49999_04 - Other Sub Sector HHLS|| HHLS|C60312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C60312_01 - Halo Pharmaceuticals Canada Inc|| HHLS|C60273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C60273_01 - Universiteten|| HHLS|C50024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50024_01 - Ethypharm|| HHLS|C50266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50266_01 - Forest Laboratories Inc.|| HHLS|C50570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50570_01 - Schering Canada Inc.|| HHLS|C50843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50843_01 - Wyeth Pharmaceutical|| HHLS|C50844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50844_01 - Janssen - CI|| HHLS|C50950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50950_01 - Bayer Diagnostics|| HHLS|C50961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50961_01 - Genzyme|| HHLS|C51170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51170_01 - Biovitrum|| HHLS|C51279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51279_01 - Fresenius Kabi|| HHLS|C51339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51339_01 - Johnson & Johnson|| HHLS|C51373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51373_01 - Life Science|| HHLS|C51411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51411_01 - MultiOpticas|| HHLS|C51486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51486_01 - Pharmadule|| HHLS|C51536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51536_01 - SANOFI-AVENTIS|| HHLS|C51578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51578_01 - SOLVAY|| HHLS|C51722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51722_01 - NOVARTIS BIOSCIENCES PERU S.A.|| HHLS|C51746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51746_01 - Akzo Nobel|| HHLS|C51759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51759_01 - Biovitrum|| HHLS|C51769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51769_01 - Fresenius Kabi|| HHLS|C51799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51799_01 - Pharmaceutical|| HHLS|C51801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51801_01 - Pharmadule|| HHLS|C51826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51826_01 - Trelleborg|| HHLS|C51893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51893_01 - Johnson & Johnson|| HHLS|C52213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52213_01 - OTICON A/S Blokeret brug 51915|| HHLS|C52224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52224_01 - Pfizer Cork Limited|| HHLS|C51483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51483_01 - Phadia|| HHLS|C51494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51494_01 - Prebio Science|| HHLS|C51798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51798_01 - Phadia|| HHLS|C60290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C60290_01 - Hjalpmedelscentrum i ostergotland|| HHLS|C70410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C70410_01 - MULTINET GAS DISTRIBUTION PARTNERSHIP|| HHLS|C80587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80587_01 - Sanofi_Aventis|| HHLS|C80689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80689_01 - Sunovion Pharmaceuticals Canada Inc|| HHLS|C80710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80710_01 - Sunovion Pharmaceuticals Canada Inc|| HHLS|C81037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C81037_01 - GE HEALTHCARE|| HHLS|C50001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C50001_01 - Laboratoire Chi-Mic|| HHLS|C80433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80433_01 - Carestream Dental Ltd|| HHLS|C10560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10560_01 - CIAQ - Centre d'insemination artificielle du Quebec|| HHLS|C10562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10562_01 - GBM - Groupe Biomedical Monteregie|| HHLS|C10676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10676_01 - Invitrogen|| HHLS|C10716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10716_01 - Optel Vision|| HHLS|C51800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51800_01 - Pharmacia|| HHLS|C40324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40324_01 - Zuellig|| HHLS|C10061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10061_01 - BD Diagnostics|| HHLS|C10086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10086_01 - Calian|| HHLS|C10163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10163_01 - Dynacare Kasper Medical Laboratories|| HHLS|C10830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10830_01 - Ichthus Consulting Inc.|| HHLS|C10879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C10879_01 - Positron Technologies|| HHLS|C51752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51752_01 - AstraZeneca|| HHLS|C52127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C52127_01 - ISS Danmark A/S - Blokeret brug 56731|| HHLS|C70634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C70634_01 - Svenska Dagbladet|| HHLS|C51175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51175_01 - Boehringer Ingelheim Danmark A/S|| HHLS|C81593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C81593_01 - La Societe Bristol-Myers Squibb Canada|| HHLS|C51396_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51396_02 - Merck & Co., Inc.|| HHLS|C80812_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C80812_02 - AbbVie Corporation|| HHLS|C81903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C81903_01 - Bayer Cropscience Inc.|| HHLS|C51746_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51746_02 - AKZO NOBEL PATE ET PERFORMANCE|| HHLS|C82026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82026_01 - Smith & Nephew UK Ltd|| HHLS|C82188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82188_01 - i-Cros NV|| HHLS|C82197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82197_01 - M�lnlycke Health Care AB|| HHLS|C82254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82254_01 - AB Innovates|| HHLS|C82284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82284_01 - Oriola-KD Oyj|| HHLS|C82391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82391_01 - Dynacare|| HHLS|C82498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82498_01 - Medtronic|| HHLS|C82549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82549_01 - Canadian Diabetes Association|| HHLS|C82631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82631_01 - Schering-Plough|| HHLS|C82647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82647_01 - STAT Imaging Solutions, LLC|| HHLS|C82783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82783_01 - Merial Inc.|| HHLS|C82793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82793_01 - Mispro Biotech Services|| HHLS|C82911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C82911_01 - TEVANEUROSCIENCE|| HHLS|C83135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83135_01 - Uniprix Inc.|| HHLS|C83258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83258_01 - Adare Pharmaceuticals, ULC|| HHLS|C51535_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C51535_13 - SANOFI AVENTIS|| HHLS|C83477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83477_01 - Alnylam Pharmaceuticals, Inc.|| HHLS|C83486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83486_01 - Beaver-Visitec|| HHLS|C83487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83487_01 - Biogen Idec Inc.|| HHLS|C83497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83497_01 - CVS CareMark|| HHLS|C83500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83500_01 - EMD Serono, Inc|| HHLS|C83504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83504_01 - ImmunoGen, Inc.|| HHLS|C83505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83505_01 - IMPAX Laboratories, Inc.|| HHLS|C83506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83506_01 - Incyte Corporation|| HHLS|C83507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83507_01 - Infinity Pharmaceuticals|| HHLS|C83508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83508_01 - Intarcia Therapeutics, Inc.|| HHLS|C83509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83509_01 - Ironwood Pharmaceuticals|| HHLS|C83510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83510_01 - IWP (Injured Workers Pharmacy)|| HHLS|C83511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83511_01 - Janssen Supply Group, LLC|| HHLS|C83512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83512_01 - Johnson & Johnson Services Inc.|| HHLS|C83520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83520_01 - New England Biolabs, Inc.|| HHLS|C83532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83532_01 - Takeda Pharmaceuticals America|| HHLS|C83533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83533_01 - Takeda Pharmaceuticals USA, Inc|| HHLS|C83534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83534_01 - TESARO, Inc.|| HHLS|C83542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83542_01 - Vertex Pharmaceuticals Incorporated|| HHLS|C83565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83565_01 - Apotek Prod & Lab|| HHLS|C83567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83567_01 - Apoteksgruppen|| HHLS|C83632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C83632_01 - Endoceutics Pharma (MSH) inc.|| HHLS|C84117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C84117_01 - TEVA Neuroscience|| HHLS|C84176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C84176_01 - Sequence Bio|| Health|Government_Health|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Government_Health|HHFA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| HHFA|C11127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C11127_01 - Health & Safety Executive|| HHFA|C11130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C11130_01 - HMT - DEPARTMENT OF HEALTH|| HHFA|C30550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30550_01 - Health and Human Services|| HHFA|C30680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30680_01 - Food & Drug Administration|| HHFA|C30783_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_02 - CMS - RAC|| HHFA|C30783_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_03 - ONC|| HHFA|C30783_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_04 - HHS/Centers for Disease Control|| HHFA|C30783_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_05 - HHS/Centers for Medicare & Medicaid Services (CMS)|| HHFA|C30783_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_06 - HHS/Centers for Medicare & Medicaid Services (CMS)|| HHFA|C30783_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_07 - Centers for Medicaid Medicaire (CMS)|| HHFA|C30783_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_08 - Centers for Medicaid Medicaire (CMS)|| HHFA|C30783_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30783_09�-�State�of�New�Jersey|| HHFA|C30838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30838_01 - Veteran Affairs Canada|| HHFA|C30838_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30838_02 - Veteran Affairs Canada|| HHFA|C30838_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30838_03 - Veteran Affairs US|| HHFA|C30258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30258_01 - Public Health Agency of Canada|| HHFA|C30258_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30258_02 - Public Health Agency of Canada|| HHFA|C31439_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31439_01 - Health & Safety Executive|| HHFA|C30926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30926_01 - Canadian Institute for Health Research|| HHFA|C30926_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30926_02 - Canadian Institute for Health Research|| HHFA|C31115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31115_01 - Healthcare Consulting|| HHFA|C31116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31116_01 - Pharmacy Consulting|| HHFA|C31117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31117_01 - HC Rec - Commercial|| HHFA|C31118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31118_01 - HC Rec - Public|| HHFA|C31119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31119_01 - HC Rec - Professional|| HHFA|C31120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31120_01 - HC Fraud Consulting|| HHFA|C31228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31228_01 - MD Physician Services (CMA)|| HHFA|C31229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31229_01 - Shared Services Canada|| HHFA|C31293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31293_01 - WA - Health Care Authority (HCA)|| HHFA|C40252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40252_01 - General Social Care Council|| HHFA|C40254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40254_01 - Healthcare|| HHFA|C40264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40264_01 - Landstinget Blekinge|| HHFA|C40306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40306_01 - Saude Central|| HHFA|C40309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40309_01 - SLL - Stockholms Lans Landsting|| HHFA|C40311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40311_01 - St Helens & Knowsley Teaching Hospitals|| HHFA|C40325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40325_01 - Healthcare|| HHFA|C40388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40388_01 - Almanna- og Heilsumálarádid|| HHFA|C40405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C40405_01 - Sundhed.dk|| HHFA|C31595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31595_01 - Regeringskansliet|| HHFA|C31626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31626_01 - Socialstyrelsen|| HHFA|C31627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31627_01 - Socialstyrelsen|| HHFA|C31714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31714_01 - Center for Døve|| HHFA|C31719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31719_01 - DTU Veterinærinstituttet|| HHFA|C31757_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31757_01 - Ministeriet for Sundhed og Forebyggelse|| HHFA|C39999_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C39999_09 - Other Sub Sector GFHC (old sub-sector)|| HHFA|C51126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C51126_01 - Apoteket|| HHFA|C51675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C51675_01 - WELLINGTON CORPORATE SERVICES|| HHFA|C81038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81038_01 - GENERAL SOCIAL CARE COUNCIL|| HHFA|C81042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81042_01 - Health Protection Agency|| HHFA|C81047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81047_01 - NICE|| HHFA|C80298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80298_01 - Kentucky Health Cooperative, Inc.|| HHFA|C80299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80299_01 - Louisiana Health Cooperative, Inc.|| HHFA|C80527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80527_01 - Dept_of_Health|| HHFA|C80574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80574_01 - Office_for_Parliamentary_&_Health|| HHFA|C80656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80656_01 - Bell Canada-ESS|| HHFA|C80764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80764_01 - Vivid Solutions Inc|| HHFA|C81187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81187_01 - Office of Medical Assistance|| HHFA|C81314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81314_01 - Secr.Gral.AdjuntadeInformáticaCSIC|| HHFA|C81371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81371_01 - Administração Central do Sistema Saúde|| HHFA|C49999_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C49999_05 - Other Sub Sector HHFA|| HHFA|C20519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C20519_01 - Sirho|| HHFA|C30851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C30851_01 - WADA - World Anti-Doping Agency|| HHFA|C31095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31095_01 - Accuro Healthcare Solutions|| HHFA|C31160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31160_01 - Catholic Healthcare West|| HHFA|C31213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31213_01 - HHS - National Institutes for Health|| HHFA|C31213_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31213_02 - HHS - Office of the National Coordinator|| HHFA|C31281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31281_01 - Canada Health Infoway Inc|| HHFA|C31308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31308_01 - Parma Public Housing Authority|| HHFA|C60254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C60254_01 - Regeringskansliet|| HHFA|C60261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C60261_01 - Socialstyrelsen|| HHFA|C80627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80627_01 - HSE|| HHFA|C81292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81292_01 - ScientificTechnologiesCorporation|| HHFA|C81820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81820_01 - CAK|| HHFA|C81834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81834_01 - Ministerie van VWS|| HHFA|C81187_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C81187_02 - VA Dept of Medical Assistance Services|| HHFA|C31212_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C31212_03 - DOD - Military Health System|| HHFA|C80389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C80389_01 - Veterans Affairs/Office of Info & Technology (OI&T|| HHFA|C82210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C82210_01 - G4 shp:t|| HHFA|C82215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C82215_01 - Keski-Suomen SHP:n kuntayhtym�|| HHFA|C82239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C82239_01 - Yo shp:t Uranus/ps|| HHFA|C82407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C82407_01 - DEPARTMENT OF HEALTH AND HUMAN SERVICES|| HHFA|C82995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C82995_01 - WELLINGTON CORPORATE SERVICES|| HHFA|C83362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C83362_01 - CAK|| HHFA|C83566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C83566_01 - Apoteket|| HHFA|C83698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C83698_01 - VA Dept of Medical Assistance Services|| HHFA|C83955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C83955_01 - Louisiana Health Cooperative, Inc.|| HHFA|C84237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHFA_Att|C84237_01 - Global Healthy Living Foundation|| Government_Health|HHPA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| HHPA|C30053_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30053_02 - CEN - TX - Dept of Human Services|| HHPA|C30080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30080_01 - INSPQ - Institut nationale de la santé publique du Québec|| HHPA|C30081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30081_01 - Local Health Integration Networks|| HHPA|C30081_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30081_02 - Local Health Integration Networks|| HHPA|C30572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30572_01 - Alberta - Medical Association|| HHPA|C30586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30586_01 - Alberta Health and Wellness|| HHPA|C30727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30727_01 - CA - Department of health care and services|| HHPA|C30727_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30727_02 - CA - Department of health care and services|| HHPA|C30840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30840_01 - Sun Microsystems|| HHPA|C30840_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30840_02 - Sun Microsystems|| HHPA|C30842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30842_01 - Plexxus|| HHPA|C30842_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30842_02 - Plexxus|| HHPA|C30843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30843_01 - RAMQ - Régie de l'assurance-maladie du Québec|| HHPA|C30843_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30843_02 - RAMQ - Régie de l'assurance-maladie du Québec|| HHPA|C30843_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30843_03 - RAMQ - Regie de l'assurance-maladie du Quebec|| HHPA|C30844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30844_01 - Saskatchewan College of Pharmacists|| HHPA|C30845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30845_01 - Saskatchewan Health Information|| HHPA|C30846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30846_01 - Sogique|| HHPA|C30846_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30846_02 - Sogique|| HHPA|C30846_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30846_03 - Sogique|| HHPA|C30848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30848_01 - BC - Ministry of Health|| HHPA|C30849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30849_01 - NB Department of Health|| HHPA|C30850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30850_01 - NS Department of Health|| HHPA|C30852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30852_01 - Saskatchewan Health|| HHPA|C30853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30853_01 - Queensland Health|| HHPA|C30866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30866_01 - Ministère de la santé et des services sociaux (MSSS)|| HHPA|C30866_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30866_02 - Ministere de la sante et des services sociaux (MSSS)|| HHPA|C30892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30892_01 - CO Dept of Healthcare Finance|| HHPA|C30232_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30232_02 - NYS Dept of Health|| HHPA|C30232_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30232_03 - CAN/NB - Dept of Health|| HHPA|C30306_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30306_02 - State of Utah|| HHPA|C30306_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30306_03 - State of Utah|| HHPA|C30356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30356_01 - Hawaii Department of Health|| HHPA|C30356_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30356_02 - Hawaii Department of Health|| HHPA|C30356_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30356_03 - Hawaii Department of Health|| HHPA|C31029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31029_01 - ACS - Affiliated Computer Services|| HHPA|C31029_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31029_02 - ACS - Affiliated Computer Services|| HHPA|C31029_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31029_03 - ACS - Affiliated Computer Services|| HHPA|C31039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31039_01 - Hennepin County Medical Center|| HHPA|C31039_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31039_02 - Hennepin County Medical Center|| HHPA|C31053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31053_01 - CHQ - Corporation d'hebergement du Quebec|| HHPA|C31062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31062_01 - eHealth Ontario|| HHPA|C31096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31096_01 - Comunidad de Madrid|| HHPA|C31100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31100_01 - Ordre des Pharmaciens du Quebec|| HHPA|C31170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31170_01 - NS - Department of Health and Wellness|| HHPA|C31178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31178_01 - eHealth Saskatchewan|| HHPA|C31195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31195_01 - BC - Health Shared Services|| HHPA|C31266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31266_01 - ASSS - Chaudiere - Appalaches|| HHPA|C31296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31296_01 - MN - Dept of Health|| HHPA|C31297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31297_01 - CA - Health Benefit Exchange|| HHPA|C31307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31307_01 - Fraser Health Authority|| HHPA|C31309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31309_01 - COLORADO HEALTH BENEFIT EXCHANGE|| HHPA|C31313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31313_01 - St. Joseph's Health Centre|| HHPA|C31319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31319_01 - CA - Dept of Healthcare Services|| HHPA|C40304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C40304_01 - Region Skane|| HHPA|C40389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C40389_01 - Danske Regioner|| HHPA|C40398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C40398_01 - Lægevagten for Københavns Amt|| HHPA|C31636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31636_01 - Sundhedsstyrelsen|| HHPA|C31783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31783_01 - Hawaii - Dept of Human Services|| HHPA|C31791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31791_01 - KentuckyOne Health, KY|| HHPA|C31792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31792_01 - Institute for Functional Medicine|| HHPA|C31793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31793_01 - AL - Medicaid Agency|| HHPA|C31795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31795_01 - Cancer Care Ontario|| HHPA|C31799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31799_01 - Department of Vermont Health Access|| HHPA|C31799_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31799_02 - Department of Vermont Health Access|| HHPA|C31802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31802_01 - OH - Office of Medicaid Assistance|| HHPA|C31802_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31802_02 - OH - Office of Medicaid Assistance|| HHPA|C39999_18|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C39999_18 - Other Sub Sector GPHC (old sub-sector)|| HHPA|C39999_27|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C39999_27 - Other Sub Sector GMHC (old sub-sector)|| HHPA|C80329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C80329_01 - CENTRAL AND NORTH WEST LONDON NHS|| HHPA|C80329_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C80329_02 - CENTRAL AND NORTH WEST LONDON NHS|| HHPA|C80329_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C80329_03 - CENTRAL AND NORTH WEST LONDON NHS|| HHPA|C80329_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C80329_04 - CENTRAL AND NORTH WEST LONDON NHS|| HHPA|C80681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C80681_01 - ASSS Laval|| HHPA|C80695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C80695_01 - Health PEI|| HHPA|C49999_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C49999_06 - Other Sub Sector HHPA|| HHPA|C10197_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C10197_02 - Procure healthcare|| HHPA|C81499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81499_01 - Consejería de Educación de la Comunidad de Madrid|| HHPA|C81171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81171_01 - Plexxus Logistics|| HHPA|C81171_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81171_02 - Plexxus Logistics|| HHPA|C30023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30023_01 - Alberta - Mental Health Board|| HHPA|C30142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30142_01 - Indian Health Service, Phoenix|| HHPA|C30313_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30313_02 - Techno-Centre (CRAG)|| HHPA|C30355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30355_01 - Santa Barbara DCSS, CA|| HHPA|C30774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30774_01 - QLD Health|| HHPA|C30904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30904_01 - Shared Services West|| HHPA|C30958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C30958_01 - ISIS Headquarters|| HHPA|C40394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C40394_01 - H:S Direktionen-SPÆRRET brug 58118|| HHPA|C81335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81335_01 - Michigan Health Information Network|| HHPA|C31301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C31301_01 - University of Massachussetts, Worcester|| HHPA|C81682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81682_01 - C81682_01 - CAN/BC - Island Health|| HHPA|C81911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81911_01 - Michigan Health Information Network|| HHPA|C81913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C81913_01 - DBHDS|| HHPA|C82007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C82007_01 - TASMANIAN PHARMACEUTICAL SERVICES BRANCH|| HHPA|C82356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C82356_01 - TAS_DEPT HEALTH AND HUMAN SERVICES_CIO|| HHPA|C82554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C82554_01 - CA - Dept of Public Health|| HHPA|C82955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C82955_01 - Virginia Department of Health|| HHPA|C40274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHLS_Att|C40274_01 - Landstinget Vasternorrland|| HHPA|C83025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83025_01 - KentuckyOne Health, KY|| HHPA|C83102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83102_01 - NSW HEALTH|| HHPA|C83111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83111_01 - Cancer Care Ontario|| HHPA|C83142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83142_01 - CAN/QC - CIUSSS Saguenay-Lac-St-Jean|| HHPA|C83288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83288_01 - Styrelsen for Sundhed og Forebyggelse|| HHPA|C83255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83255_01 - CAN/QC - CIUSSS Est-?le-Montr?al|| HHPA|C83257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83257_01 - CAN/QC - CIUSSS Est-?le-Montr?al|| HHPA|C83367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83367_01 - NVWA|| HHPA|C83406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83406_01 - Leigh-Ann, Health & Production|| HHPA|C83408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83408_01 - Canadian Food Inspection Agency|| HHPA|C83768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83768_01 - BJCHealthCare|| HHPA|C83913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83913_01 - HEALTH MANAGEMENT ASSOCIATES|| HHPA|C83923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83923_01 - IL DEPT HEALTHCARE|| HHPA|C83946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C83946_01 - LANCASTER GENERAL HOSP|| HHPA|C84014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84014_01 - ORLANDO HEALTH|| HHPA|C84029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84029_01 - PARTNERS HC SYS, INC.|| HHPA|C84044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84044_01 - PROVIDENCE|| HHPA|C84097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84097_01 - State of Utah|| HHPA|C84159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84159_01 - WEST PENN ALLEGHANY HLT|| HHPA|C84164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84164_01 - WI DPT HEALTH & FAMILY SVCS|| HHPA|C84178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84178_01 - eHealth Ontario|| HHPA|C84355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||HHPA_Att|C84355_01 - MN - Dept of Health|| Sectors|MRD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MRD|Manufacturing|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Manufacturing|| Manufacturing|Natural_Resources|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Natural_Resources|MMME|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMME|C50027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50027_01 - Alcoa|| MMME|C50027_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50027_02 - Alcoa|| MMME|C50039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50039_01 - American Iron and Metal|| MMME|C50039_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50039_02 - American Iron and Metal|| MMME|C51200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51200_01 - Cimpor|| MMME|C51237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51237_01 - DLF Trifolium A/S|| MMME|C51281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51281_01 - Frosta|| MMME|C51295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51295_01 - Grycksbo|| MMME|C51299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51299_01 - HeidelbergCement|| MMME|C51319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51319_01 - IMP|| MMME|C51326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51326_01 - Isku-Yhtyma Oy|| MMME|C51360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51360_01 - Korsnas|| MMME|C51367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51367_01 - Lannen Tehtaat Oyj|| MMME|C51399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51399_01 - Metsaliitto|| MMME|C51408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51408_01 - M-real|| MMME|C51431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51431_01 - Norsk Hydro Olje AB|| MMME|C51442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51442_01 - Orkla ASA|| MMME|C50207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50207_01 - Dofasco Inc.|| MMME|C50337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50337_01 - Evraz Inc.|| MMME|C50421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50421_01 - Mittal Steel USA - Columbus|| MMME|C50421_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50421_02 - Mittal Canada Inc. (Sidbec)|| MMME|C50445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50445_01 - Arcelormittal Montréal Inc.|| MMME|C50445_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50445_02 - Arcelormittal Montréal Inc.|| MMME|C50445_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50445_03 - Arcelormittal Montreal Inc.|| MMME|C50445_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50445_04 - Arcelormittal Montréal Inc.|| MMME|C50445_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50445_05 - AM Exploitation miniere Canada|| MMME|C50453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50453_01 - Novelis|| MMME|C50453_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50453_02 - Novelis (India)|| MMME|C50521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50521_01 - QIT - Fet et Titane Inc.|| MMME|C50521_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50521_02 - QIT - Fet et Titane Inc.|| MMME|C50600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50600_01 - Spartan Steel Coating, LLC|| MMME|C50600_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50600_02 - Spartan Steel Coating, LLC|| MMME|C50719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50719_01 - Ipsco Inc.|| MMME|C50787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50787_01 - Four Square - div. of Mars UK|| MMME|C50788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50788_01 - Siemans AG|| MMME|C50806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50806_01 - Thyssen Krupp|| MMME|C50910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50910_01 - Columbus Coatings Company|| MMME|C50910_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50910_02 - Columbus Coatings Company|| MMME|C50946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50946_01 - Iron Ore|| MMME|C51047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51047_01 - Groupe ADF Inc.|| MMME|C51066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51066_01 - BHP Billiton Canada Inc.|| MMME|C51083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51083_01 - IPSCO Tubulars Inc|| MMME|C51130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_01 - ARCELOR|| MMME|C51130_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_02 - ARCELOR|| MMME|C51130_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_03 - ARCELOR|| MMME|C51130_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_04 - ARCELOR|| MMME|C51130_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_05 - ARCELOR|| MMME|C51130_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_06 - ARCELOR|| MMME|C51130_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_07 - ARCELOR|| MMME|C51130_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_08 - ARCELOR|| MMME|C51130_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_11 - ARCELOR|| MMME|C51131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51131_01 - Arcelor Mittal|| MMME|C51156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51156_01 - Bahco|| MMME|C51164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51164_01 - Bergkvist|| MMME|C51165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51165_01 - Bergvik|| MMME|C51169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51169_01 - Billerud|| MMME|C51178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51178_01 - Boliden|| MMME|C51583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51583_01 - SSAB|| MMME|C51724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51724_01 - RIALCA Centro de Producion Rines de Aluminio|| MMME|C51934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51934_01 - B.O. Nielsen Jern and Stål Agentur|| MMME|C51979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51979_01 - Carl C A/S|| MMME|C52072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52072_01 - Frese Metal- og Stålstøberi A/S|| MMME|C52076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52076_01 - Fyns Kork- og Metalindustri|| MMME|C52104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52104_01 - Hjulby Automatdrejning|| MMME|C52109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52109_01 - HSM Industri A/S|| MMME|C52111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52111_01 - SAPA Denmark A/S|| MMME|C52112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52112_01 - Ib Andresen Industri A/S|| MMME|C51471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51471_01 - Outokumpu Oyj|| MMME|C51472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51472_01 - Outotec Oyj|| MMME|C51496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51496_01 - Pressalit A/S|| MMME|C51502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51502_01 - Pyroll Group Oy|| MMME|C51510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51510_01 - Rautaruukki Oyj|| MMME|C51518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51518_01 - Rexcell|| MMME|C51542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51542_01 - SCA|| MMME|C51544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51544_01 - Scana Steel|| MMME|C52123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52123_01 - Inox Stål Handelsselskab A/S|| MMME|C52155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C52155_01 - Lem Beslagfabrik A/S|| MMME|C59999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C59999_03 - Other Sub Sector MMPM (old sub-sector)|| MMME|C59999_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C59999_05 - Other Sub Sector MMME|| MMME|C81525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C81525_01 - Klöckner & Co AG|| MMME|C51254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51254_01 - EraSteel|| MMME|C51756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51756_01 - Bergkvist|| MMME|C51757_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51757_01 - Bergvik|| MMME|C51758_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51758_01 - Billerud|| MMME|C51760_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51760_01 - Boliden|| MMME|C51768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51768_01 - EraSteel|| MMME|C51772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51772_01 - Grycksbo|| MMME|C51775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51775_01 - HeidelbergCement|| MMME|C51777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51777_01 - Holmen|| MMME|C51784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51784_01 - Korsnas|| MMME|C51789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51789_01 - Metsaliitto|| MMME|C51791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51791_01 - M-real|| MMME|C51794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51794_01 - Orkla ASA|| MMME|C51805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51805_01 - Rexcell|| MMME|C51809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51809_01 - SCA|| MMME|C51810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51810_01 - Scana Steel|| MMME|C51818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51818_01 - SSAB|| MMME|C51861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51861_01 - IMP|| MMME|C40407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C40407_01 - ArcelorMittal Columbus LLC|| MMME|C50088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50088_01 - Bibby-Ste-Croix|| MMME|C50212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50212_01 - Douglas Barwick Inc.|| MMME|C50259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50259_01 - Extrudex Aluminium Québec|| MMME|C50273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50273_01 - Future Steel|| MMME|C50302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50302_01 - Groupe Canam Inc.|| MMME|C50370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50370_01 - Les Forges de Sorel Cie|| MMME|C50380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50380_01 - Logan Aluminum|| MMME|C50449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50449_01 - North Star Bluescope Steel|| MMME|C50576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50576_01 - SeverCorr|| MMME|C50722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50722_01 - Centre des technologies de l'aluminium|| MMME|C50916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C50916_01 - Ivaco Rolling Mills|| MMME|C51150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51150_01 - AvestaPolarit|| MMME|C10563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C10563_01 - LAR Machinerie Inc.|| MMME|C70262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C70262_01 - BLUESCOPE STEEL AIS PTY LTD|| MMME|C81276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C81276_01 - NovelisCorporation|| MMME|C51473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51473_01 - Ovako|| MMME|C51470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51470_01 - Outokumpu|| MMME|C81621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C81621_01 - Ribe Jerndustri A/S|| MMME|C81876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C81876_01 - Alsic|| MMME|C81880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C81880_01 - General Cable Company|| MMME|C82110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C82110_01 - BE Group AB|| MMME|C83066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83066_01 - Shawinigan-Aluminium|| MMME|C83067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83067_01 - Carbone Savoie|| MMME|C51130_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C51130_13 - ARCELOR|| MMME|C83687_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83687_01 - OneSteel NSW Pty Limited|| MMME|C83717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83717_01 - Alcoa|| MMME|C83789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83789_01 - CASTLE RESOURCES, INC.|| MMME|C83796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83796_01 - CHALLENGER MINERALS, INC.|| MMME|C83889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83889_01 - FREEPORT-MCMORAN|| MMME|C83909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C83909_01 - Harkey PPI Minerals Acquisition I, LP|| MMME|C84008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C84008_01 - Novelis Corporation|| MMME|C84021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C84021_01 - Palo Abraxus Minerals, LP|| Natural_Resources|MMMI|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMMI|C40406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C40406_01 - Ressources d?Arianne Inc, Les|| MMMI|C50025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50025_01 - Rio Tinto Alcan|| MMMI|C50025_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50025_02 - Rio Tinto Alcan|| MMMI|C50025_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50025_03 - Rio Tinto Alcan 2|| MMMI|C50025_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50025_04 - Rio Tinto Alcan|| MMMI|C50025_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50025_05 - Rio Tinto Alcan|| MMMI|C50025_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50025_07 - Rio Tinto Alcan|| MMMI|C50025_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50025_08 - Rio Tinto Alcan|| MMMI|C50034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50034_01 - Alcan Packaging|| MMMI|C50034_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50034_02 - Alcan Packaging|| MMMI|C50034_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50034_03 - Alcan Packaging|| MMMI|C50105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50105_01 - Bosai Minerals Groupe Inc.|| MMMI|C50105_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50105_02 - Bosai Minerals Groupe Inc.|| MMMI|C51377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51377_01 - LKAB|| MMMI|C50292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50292_01 - GrafTech International Ltd|| MMMI|C50877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50877_01 - IAMGOLD CORPORATION|| MMMI|C50877_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50877_02 - Gestion Iamgold Quebec Inc.|| MMMI|C51032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51032_01 - Cameco|| MMMI|C51058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51058_01 - Inmet Mining Corporation|| MMMI|C51058_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51058_02 - Inmet Mining Corporation|| MMMI|C51087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51087_01 - Canarc Resource Corp.|| MMMI|C51094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51094_01 - Compagnie Miniere IOC Inc.|| MMMI|C51579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51579_01 - SOMINCOR|| MMMI|C51522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_01 - RIO TINTO|| MMMI|C51522_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_02 - RIO TINTO|| MMMI|C51522_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_03 - RIO TINTO|| MMMI|C51522_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_04 - RIO TINTO|| MMMI|C51522_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_05 - RIO TINTO|| MMMI|C51522_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_06 - RIO TINTO|| MMMI|C51522_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_08 - RIO TINTO|| MMMI|C51522_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_11 - RIO TINTO|| MMMI|C51522_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_12 - RIO TINTO|| MMMI|C80334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C80334_01 - Franco-Nevada Corporation|| MMMI|C80364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C80364_01 - Cleveland Potash Limited|| MMMI|C80525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C80525_01 - De_Beers|| MMMI|C81339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C81339_01 - Arcelormittal Mines Canada Inc.|| MMMI|C59999_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C59999_06 - Other Sub Sector MMMI|| MMMI|C11097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C11097_01 - STEAG Power Minerals GmbH|| MMMI|C51555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51555_01 - Secil|| MMMI|C51729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51729_01 - XSTRATA PERU S.A.|| MMMI|C51785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51785_01 - LKAB|| MMMI|C50023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50023_01 - Alcan Corporation|| MMMI|C50159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50159_01 - Clevelands Cliff|| MMMI|C50420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50420_01 - Mines Wabush|| MMMI|C50723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50723_01 - Secal - Usine Laterriere|| MMMI|C50876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C50876_01 - Imerys|| MMMI|C60186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C60186_01 - GEOTEC SA|| MMMI|C80619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C80619_01 - Cleveland_Potash|| MMMI|C81579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C81579_01 - RIO TINTO|| MMMI|C82104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C82104_01 - Northland Resources AB|| MMMI|C82548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C82548_01 - SMS Equipment Inc.|| MMMI|C82565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C82565_01 - Diavik Diamond Mines (2012) Inc.|| MMMI|C82782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C82782_01 - Mine Niobec|| MMMI|C51522_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C51522_07 - RIO TINTO|| MMMI|C83816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C83816_01 - Cliffs Natural Resources|| MMMI|C84068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C84068_01 - Sandvik Mining and Construction USA|| MMMI|C21929_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C21929_07 - ERAMET|| MMMI|C84264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMMI_Att|C84264_01 - Vulcan Materials Company|| Natural_Resources|MMPP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMPP|C50005_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50005_07 - Canadian Bank Note Company, Limited|| MMPP|C50142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50142_01 - Cascades Inc.|| MMPP|C50142_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50142_03 - Cascades Inc.|| MMPP|C50142_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50142_04 - Cascades Inc.|| MMPP|C51344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51344_01 - Kappa|| MMPP|C51400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51400_01 - Metso|| MMPP|C50210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50210_01 - Domtar|| MMPP|C50467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50467_01 - Papiers White Birch|| MMPP|C50811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50811_01 - Lauzon - Planchers de bois exclusifs|| MMPP|C51577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51577_01 - Sodra Skogsagarna|| MMPP|C51594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51594_01 - Stora Enso|| MMPP|C51595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51595_01 - Stora Enso Oyj|| MMPP|C51599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51599_01 - Suzano|| MMPP|C51600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51600_01 - Sveaskog|| MMPP|C51603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51603_01 - Svensk Mjolk|| MMPP|C51621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51621_01 - Tetra Pak|| MMPP|C51976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51976_01 - Cabinplant A/S|| MMPP|C51476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51476_01 - Paper-Pak|| MMPP|C51571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51571_01 - Skogssallskapet|| MMPP|C52151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52151_01 - Lammefjordens Stauder|| MMPP|C52158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52158_01 - Lignal A/S|| MMPP|C52159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52159_01 - Limagrain A/S|| MMPP|C52258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52258_01 - Scandinavian Instant Trees|| MMPP|C52264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52264_01 - Scanprint A/S|| MMPP|C52314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52314_01 - Uttenthal A/S|| MMPP|C52333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52333_01 - AMERIND PTY LTD|| MMPP|C52344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52344_01 - Enveloppes Demers Inc, Les|| MMPP|C80001_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C80001_02 - Abitibi-Consolidated Inc.|| MMPP|C80538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C80538_01 - Genus_Breeding|| MMPP|C80734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C80734_01 - Tembec Inc.|| MMPP|C81345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C81345_01 - EastGen|| MMPP|C59999_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C59999_07 - Other Sub Sector MMPP|| MMPP|C52335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C52335_01 - BEKAERT AUSTRALIA PTY LTD|| MMPP|C51489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51489_01 - The Navigator Company|| MMPP|C51592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51592_01 - Stenqvist|| MMPP|C51782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51782_01 - Kappa|| MMPP|C51788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51788_01 - Metso|| MMPP|C51797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51797_01 - Paper-Pak|| MMPP|C51816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51816_01 - Skogssallskapet|| MMPP|C51820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51820_01 - Stenqvist|| MMPP|C51821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51821_01 - Stora Enso|| MMPP|C51822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51822_01 - Sveaskog|| MMPP|C51823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51823_01 - Sodra Skogsagarna|| MMPP|C51824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51824_01 - Tetra Pak|| MMPP|C50007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50007_01 - Abitibi-Consolidated Inc.|| MMPP|C50108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50108_01 - Bowater|| MMPP|C50176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50176_01 - Coop��rative forestière Laterrière|| MMPP|C50218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50218_01 - Dyne-a-Pak Inc.|| MMPP|C50221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50221_01 - Ébénisterie G.D. Pro|| MMPP|C50283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50283_01 - Genpak - Aurora|| MMPP|C50359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50359_01 - Kruger Inc.|| MMPP|C50543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50543_01 - Reno De Medici|| MMPP|C50543_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50543_02 - Reno De Medici|| MMPP|C50555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50555_01 - RK Group|| MMPP|C50584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50584_01 - Simon Lussier Ltée|| MMPP|C50681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50681_01 - Weigh Pack System|| MMPP|C50791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50791_01 - Impression Paragraph Inc.|| MMPP|C51115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51115_01 - akerlund & Rausing AB|| MMPP|C51263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51263_01 - Finn Forest|| MMPP|C51877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51877_01 - Svensk Mjolk|| MMPP|C80711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C80711_01 - CPG Continental Paper Grading|| MMPP|C10005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C10005_01 - Abeilles Busy Bees|| MMPP|C51132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51132_01 - Arctic|| MMPP|C51132_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51132_02 - Arctic|| MMPP|C51277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51277_01 - Frantschach|| MMPP|C51750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51750_01 - Arctic|| MMPP|C51303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C51303_01 - Holmen|| MMPP|C81576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C81576_01 - BARRETTE CHAPAIS|| MMPP|C81612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C81612_01 - Richelieu Hardware Ltd.|| MMPP|C81845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C81845_01 - TEMBEC|| MMPP|C81902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C81902_01 - Produits forestiers Resolu|| MMPP|C81905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C81905_01 - Greenpoint Consulting group, Inc|| MMPP|C50016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50016_01 - Agropur|| MMPP|C50016_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50016_02 - Agropur|| MMPP|C50017_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50017_04 - Agropur Cooperative|| MMPP|C50017_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50017_03 - Agropur Cooperative|| MMPP|C50017_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50017_05 - Agropur Cooperative|| MMPP|C50017_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50017_06 - Agropur Cooperative|| MMPP|C50017_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50017_02 - Agropur Cooperative|| MMPP|C50434_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C50434_02 - Agropur Division Natrel|| MMPP|C82101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C82101_01 - OKAB Convert AB|| MMPP|C82300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C82300_01 - Arctic Paper Munkedals AB|| MMPP|C82320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C82320_01 - Vida Skog AB|| MMPP|C83581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C83581_01 - Alberta Pacific Forest Industries Inc.|| MMPP|C83736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C83736_01 - Arcadia|| MMPP|C84266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C84266_01 - WinPak|| MMPP|C84269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C84269_01 - Clayton Homes|| MMPP|C84367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMPP_Att|C84367_01 - Westrock Company|| Natural_Resources|MMCH|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMCH|C50019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_01 - Air Liquide|| MMCH|C50019_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_02 - Air Liquide|| MMCH|C50019_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_03 - Air Liquide|| MMCH|C50019_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_04 - Air Liquide|| MMCH|C50019_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_05 - Air Liquide|| MMCH|C50019_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_06 - Air Liquide|| MMCH|C50019_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_07 - Air Liquide|| MMCH|C50019_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50019_08 - Air Liquide|| MMCH|C50150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50150_01 - Chemtrade Logistics Inc.|| MMCH|C51207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51207_01 - COLEP|| MMCH|C51220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51220_01 - DAFA A/S|| MMCH|C51289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51289_01 - Givaudan|| MMCH|C51438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51438_01 - Ole Nonbye A/S|| MMCH|C50328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50328_01 - Industries Plastipak Inc.|| MMCH|C50580_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50580_02 - Sico Inc.|| MMCH|C50580_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50580_03 - Sico Inc.|| MMCH|C50580_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50580_04 - Sico Inc.|| MMCH|C50716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50716_01 - Air Liquide|| MMCH|C50897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50897_01 - AkzoNobel Canada (Sico)|| MMCH|C50897_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50897_02 - AkzoNobel Canada (Sico)|| MMCH|C50906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50906_01 - Celanese|| MMCH|C50929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50929_01 - Hexion Specialty Chemicals|| MMCH|C51007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51007_01 - F. Dufresne Inc.|| MMCH|C51060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51060_01 - Infineum USA L.P.|| MMCH|C51077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51077_01 - AZZ Incorporated|| MMCH|C51114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_01 - AIR LIQUIDE|| MMCH|C51114_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_02 - AIR LIQUIDE|| MMCH|C51114_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_03 - AIR LIQUIDE|| MMCH|C51114_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_04 - AIR LIQUIDE|| MMCH|C51114_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_05 - AIR LIQUIDE|| MMCH|C51114_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_06 - AIR LIQUIDE|| MMCH|C51114_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_08 - AIR LIQUIDE|| MMCH|C51114_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_09 - AIR LIQUIDE|| MMCH|C51658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51658_01 - UPM-Kymmene Oyj|| MMCH|C51706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51706_01 - Sabic|| MMCH|C51720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51720_01 - Industrias Ceresita S.A|| MMCH|C52008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52008_01 - Dankemi Bilplejemidler ApS|| MMCH|C52025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52025_01 - Deco Team A/S|| MMCH|C52059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52059_01 - Estee Lauder Cosmetics A/S|| MMCH|C52094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52094_01 - H2 Logic A/S|| MMCH|C51454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_01 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_02 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_03 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_04 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_05 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_06 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_08 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_09 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_11 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51454_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_12 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_01 - RHODIA|| MMCH|C51519_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_02 - RHODIA|| MMCH|C51519_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_03 - RHODIA|| MMCH|C51519_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_04 - RHODIA|| MMCH|C51519_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_05 - RHODIA|| MMCH|C51519_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_06 - RHODIA|| MMCH|C51519_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_08 - RHODIA|| MMCH|C51519_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_11 - RHODIA|| MMCH|C52198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52198_01 - Nopa - Nordic A/S|| MMCH|C52228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52228_01 - PMN Industri A/S|| MMCH|C52233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52233_01 - R2 Group A/S|| MMCH|C52250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52250_01 - Salling Plast A/S|| MMCH|C52346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C52346_01 - InterWrap Inc.|| MMCH|C80491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C80491_01 - Afton_Chemical|| MMCH|C81396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C81396_01 - BASF Española, S.L.U.|| MMCH|C59999_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C59999_08 - Other Sub Sector MMCH|| MMCH|C50011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50011_01 - Adfast Corporation|| MMCH|C50186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50186_01 - Cruchons J.U.G.S. Inc.|| MMCH|C50399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50399_01 - Marsulex Inc.|| MMCH|C50485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50485_01 - Petresa Canada|| MMCH|C50504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50504_01 - PPG Canada Inc.|| MMCH|C50510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50510_01 - Produits Polychem Ltée|| MMCH|C50516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50516_01 - Protech Chemicals Ltd|| MMCH|C50534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50534_01 - Rayonese Textile Inc.|| MMCH|C50601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50601_01 - Spartech Color|| MMCH|C50732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C50732_01 - Chemtrade Logistic Inc.|| MMCH|C10385_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C10385_02 - Quadra Chemicals Ltd|| MMCH|C80434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C80434_01 - RTP UK Ltd|| MMCH|C80832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C80832_01 - Air Liquide|| MMCH|C81355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C81355_01 - European Molecular Biology Laboratory|| MMCH|C10263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C10263_01 - Kama Pigments|| MMCH|C10307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C10307_01 - Marsulex Inc.|| MMCH|C51308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51308_01 - Huntsman|| MMCH|C81582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C81582_01 - PLASTIQUE MICRON|| MMCH|C81657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C81657_01 - Rosti It A/S|| MMCH|C81887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C81887_01 - NLM Vantinge A/S|| MMCH|C82339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82339_01 - Kemikalieinspektionen|| MMCH|C82366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82366_01 - IXOM OPERATIONS PTY LTD|| MMCH|C82424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82424_01 - Chemtrade Logistics Inc.|| MMCH|C82489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82489_01 - AkzoNobel|| MMCH|C82507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82507_01 - Sabic|| MMCH|C82563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82563_01 - Ressources d�Arianne Inc, Les|| MMCH|C82897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82897_01 - CELANESEINTERNATIONALCORP|| MMCH|C82914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C82914_01 - HEXIONSPECIALTYCHEMICALS|| MMCH|C83342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83342_01 - SCA Hygiene|| MMCH|C51114_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51114_10 - AIR LIQUIDE|| MMCH|C51454_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51454_07 - OTHERS - CHEMIST & BEAUTY CARE|| MMCH|C51519_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51519_07 - RHODIA|| MMCH|C83418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83418_01 - Signet|| MMCH|C83462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83462_01 - Kingspan CZ|| MMCH|C51464_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C51464_11 - SOLVAY|| MMCH|C83554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83554_01 - Emerald Performance Material|| MMCH|C83555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83555_01 - Callisons|| MMCH|C83558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83558_01 - Emerald Performance Materials, LLC|| MMCH|C83792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83792_01 - CELANESE INTERNATIONAL CORP|| MMCH|C83800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83800_01 - CHEVRON PHILLIPS CHEMICAL COMPANY|| MMCH|C83916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C83916_01 - HEXION SPECIALTY CHEMICALS|| MMCH|C84081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C84081_01 - SOUTHERN CHEMICAL CORPORATION|| MMCH|C21928_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C21928_07 - CLARINS|| MMCH|C21928_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C21928_11 - CLARINS|| MMCH|C21932_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C21932_02 - IPSEN|| MMCH|C21932_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C21932_07 - IPSEN|| MMCH|C21965_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C21965_02 - SERVIER|| MMCH|C21965_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C21965_07 - SERVIER|| MMCH|C84278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C84278_01 - AkzoNobel|| MMCH|C84326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C84326_01 - Lyondell Chemical US|| MMCH|C84357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMCH_Att|C84357_01 - Lyondell Basell|| Manufacturing|Commercial_and_Industrial_Goods|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Commercial_and_Industrial_Goods|MMAS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMAS|C11093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C11093_01 - Raytheon Company|| MMAS|C11093_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C11093_02 - Raytheon UK|| MMAS|C31404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C31404_01 - EADS Astrium|| MMAS|C31331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C31331_01 - ASTRIUM LTD|| MMAS|C31331_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C31331_02 - ASTRIUM LTD|| MMAS|C31331_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C31331_03 - ASTRIUM LTD|| MMAS|C31645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C31645_01 - Thales Group|| MMAS|C51228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_01 - DASSAULT AVIATION|| MMAS|C51228_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_02 - DASSAULT|| MMAS|C51228_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_03 - DASSAULT|| MMAS|C51228_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_04 - DASSAULT|| MMAS|C51228_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_05 - DASSAULT|| MMAS|C51228_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_06 - DASSAULT|| MMAS|C51228_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_08 - DASSAULT|| MMAS|C51228_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_09 - DASSAULT|| MMAS|C51244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_01 - EADS|| MMAS|C51244_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_02 - EADS|| MMAS|C51244_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_03 - EADS|| MMAS|C51244_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_04 - EADS|| MMAS|C51244_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_05 - EADS|| MMAS|C51244_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_06 - EADS|| MMAS|C51244_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_08 - EADS|| MMAS|C51244_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_09 - EADS|| MMAS|C51244_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_11 - EADS|| MMAS|C51244_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_12 - EADS|| MMAS|C51245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51245_01 - EADS|| MMAS|C50306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50306_01 - Heroux|| MMAS|C50306_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50306_02 - Heroux Devtek|| MMAS|C50306_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50306_03 - Heroux Devtek|| MMAS|C50309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50309_01 - Bombardier Aeronautique|| MMAS|C50309_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50309_02 - Bombardier Aéronautique|| MMAS|C50309_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50309_03 - Bombardier Aéronautique|| MMAS|C50309_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50309_05 - Bombardier Aéronautique|| MMAS|C50309_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50309_06 - Bombardier Aéronautique|| MMAS|C50309_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50309_07 - Bombardier Aéronautique|| MMAS|C50309_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50309_08 - Bombardier Aerospace|| MMAS|C50361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50361_01 - L-3 Communications|| MMAS|C50361_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50361_02 - L-3 Communications Canada Inc.|| MMAS|C50361_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50361_03 - L-3 COMMUNICATIONS IS|| MMAS|C50875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50875_01 - Learjet Inc.|| MMAS|C50875_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50875_02 - Learjet Inc.|| MMAS|C51027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51027_01 - Bombardier Aerospace|| MMAS|C51027_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51027_02 - Bombardier Aerospace|| MMAS|C51622_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_02 - THALES|| MMAS|C51622_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_03 - THALES|| MMAS|C51622_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_04 - THALES|| MMAS|C51622_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_05 - THALES|| MMAS|C51622_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_06 - THALES|| MMAS|C51622_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_08 - THALES|| MMAS|C51622_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_12 - THALES|| MMAS|C51732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51732_01 - PCC Aerostructures Dorval|| MMAS|C51732_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51732_02 - PCC Aerostructures Dorval|| MMAS|C51528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_01 - SAFRAN|| MMAS|C51528_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_02 - SAFRAN|| MMAS|C51528_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_03 - SAFRAN|| MMAS|C51528_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_04 - SAFRAN|| MMAS|C51528_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_05 - SAFRAN|| MMAS|C51528_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_06 - SAFRAN|| MMAS|C51528_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_08 - SAFRAN|| MMAS|C51528_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_09 - SAFRAN|| MMAS|C51528_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_12 - SAFRAN|| MMAS|C51559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51559_01 - Service Point UK Ltd|| MMAS|C81067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81067_01 - ASTRIUM LTD|| MMAS|C81069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81069_01 - ASTRIUM SAS|| MMAS|C81083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81083_01 - DEIMOS SPACE S.L.U.|| MMAS|C81084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81084_01 - DLR Gesellschaft f. Raumfahrtanwendungen|| MMAS|C81120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81120_01 - L-3 COMMUNICATIONS IS|| MMAS|C81122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81122_01 - LOCKHEED MARTIN UK LTD|| MMAS|C81140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81140_01 - Space Applications Catapult|| MMAS|C80699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C80699_01 - Thales Alenia Space Italia SpA|| MMAS|C80818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C80818_01 - INSA, Ingenieria y Serv.y Aeroespeciales|| MMAS|C81212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81212_01 - Aero Montreal|| MMAS|C81225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81225_01 - Turbomeca Canada Inc|| MMAS|C10546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C10546_01 - UCAR - University Corporation for Atmospheric Research|| MMAS|C59999_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C59999_09 - Other Sub Sector MMAS|| MMAS|C51765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51765_01 - EADS|| MMAS|C50192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50192_01 - Dassault Systèmes|| MMAS|C50233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50233_01 - EMS Technologie Canada Inc.|| MMAS|C50413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C50413_01 - Messier-Dowty Inc.|| MMAS|C51246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51246_01 - EADS|| MMAS|C10537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C10537_01 - SCASO - Service et construction aéronautique du sud-ouest|| MMAS|C81068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81068_01 - Astrium Ltd.|| MMAS|C10146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C10146_01 - Dassault Systemes|| MMAS|C10185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C10185_01 - ExelTech Aerospace Inc.|| MMAS|C80472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C80472_01 - United Technologies Corporation|| MMAS|C81590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81590_01 - INDRA Sistemas, S.A.|| MMAS|C81591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81591_01 - Cobham PLC|| MMAS|C81610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81610_01 - Cobham PLC|| MMAS|C51528_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_13 - SAFRAN|| MMAS|C81700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81700_01 - Aircraft Maintenance Systems|| MMAS|C51622_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_13 - Thales|| MMAS|C81868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81868_01 - Heroux-Devtek Inc.|| MMAS|C31331_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C31331_04 - AstriumLtd.|| MMAS|C81950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C81950_01 - SNECMA|| MMAS|C82017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82017_01 - Heroux Devtek|| MMAS|C51622_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_09 - THALES|| MMAS|C82030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82030_01 - VistaJet International Ltd.|| MMAS|C51622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_01 - THALES|| MMAS|C10921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C10921_01 - CAE|| MMAS|C82123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82123_01 - GKN Aerospace Sweden AB|| MMAS|C82200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82200_01 - Airbus Defence and Space Oy|| MMAS|C82419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82419_01 - Northrop Grumman Corporation|| MMAS|C82468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82468_01 - CAE|| MMAS|C51228_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_12 - DASSAULT AVIATION|| MMAS|C82561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82561_01 - Bell Helicopter Textron Canada Limitée|| MMAS|C82839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82839_01 - RHEA System S.A.|| MMAS|C82861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C82861_01 - IFALPA|| MMAS|C83014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83014_01 - PCC Aerostructures|| MMAS|C83014_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83014_02 - PCC Aerostructures|| MMAS|C83071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83071_01 - Nav Canada|| MMAS|C83096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83096_01 - AIRBUS DEFENCE AND SPACE SA|| MMAS|C83190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83190_01 - GKN Aerospace Sweden AB|| MMAS|C83374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83374_01 - Thales|| MMAS|C51228_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51228_07 - DASSAULT|| MMAS|C51244_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51244_07 - AIRBUS|| MMAS|C51528_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51528_07 - SAFRAN|| MMAS|C51622_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C51622_07 - THALES|| MMAS|C83431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83431_01 - AIRBUS|| MMAS|C83436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83436_01 - THALES|| MMAS|C83673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C83673_01 - Esterline Technologies Corporation|| MMAS|C84007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAS_Att|C84007_01 - Northrop Grumman Corporation|| Commercial_and_Industrial_Goods|MMAU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMAU|C11122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C11122_01 - Ford|| MMAU|C11152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C11152_01 - Rolls Royce & Assocaites Ltd|| MMAU|C50033_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_02 - Alstom|| MMAU|C50033_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_03 - Alstom|| MMAU|C50033_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_04 - Alstom|| MMAU|C50033_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_05 - Alstom|| MMAU|C50033_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_06 - Alstom-Grid SAS - IST|| MMAU|C50033_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_07 - Alstom|| MMAU|C50033_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_08 - Alstom|| MMAU|C50033_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50033_09 - Alstom|| MMAU|C50102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50102_01 - Bombardier|| MMAU|C50102_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50102_02 - Bombardier|| MMAU|C50102_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50102_03 - Bombardier|| MMAU|C50102_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50102_04 - Bombardier|| MMAU|C50102_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50102_05 - Bombardier Transport Canada Inc|| MMAU|C50115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50115_01 - Bridgestone / Firestone|| MMAU|C50115_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50115_02 - Bridgestone / Firestone|| MMAU|C50189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50189_01 - Daimler Chrysler|| MMAU|C50189_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50189_02 - Daimler Chrysler|| MMAU|C50189_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50189_03 - Daimler Chrysler|| MMAU|C50189_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50189_04 - Daimler Chrysler|| MMAU|C50189_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50189_05 - Daimler Chrysler|| MMAU|C51203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51203_01 - CME|| MMAU|C51222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51222_01 - Daimler|| MMAU|C51223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51223_01 - Daimler AG|| MMAU|C51269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51269_01 - Ford|| MMAU|C51271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51271_01 - Ford|| MMAU|C51272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51272_01 - Ford Werke GMBH|| MMAU|C51273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51273_01 - Fordonsleverantore|| MMAU|C51333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51333_01 - JAGUAR LAND ROVER|| MMAU|C51358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51358_01 - Kockums|| MMAU|C51359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51359_01 - Kongsberg Maritime AS|| MMAU|C51387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51387_01 - MAN|| MMAU|C51401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_01 - MICHELIN|| MMAU|C51401_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_02 - MICHELIN|| MMAU|C51401_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_03 - MICHELIN|| MMAU|C51401_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_04 - MICHELIN|| MMAU|C51401_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_05 - MICHELIN|| MMAU|C51401_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_06 - MICHELIN|| MMAU|C51401_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_08 - MICHELIN|| MMAU|C51401_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_11 - MICHELIN|| MMAU|C51401_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51401_12 - MICHELIN|| MMAU|C50350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50350_01 - Kenworth du Canada|| MMAU|C50415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50415_01 - MICHELIN|| MMAU|C50415_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50415_02 - MICHELIN NORTH AMERICA INC|| MMAU|C50554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50554_01 - Bombardier Produits Recreatifs|| MMAU|C50554_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50554_02 - Bombardier Produits Recreatifs|| MMAU|C50554_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50554_03 - Bombardier Produits Récréatifs|| MMAU|C50714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50714_01 - Alstom Grid|| MMAU|C50714_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50714_02 - Alstom Grid|| MMAU|C50714_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50714_03 - Alstom Grid|| MMAU|C50733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50733_01 - Prevost Car Inc.|| MMAU|C50805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50805_01 - Seat|| MMAU|C50805_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50805_02 - Seat|| MMAU|C50805_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50805_03 - Seat|| MMAU|C50805_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50805_04 - Seat|| MMAU|C50879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50879_01 - Gedia|| MMAU|C50879_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50879_02 - Gedia|| MMAU|C50879_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50879_03 - Gedia|| MMAU|C50899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50899_01 - Honda Canada Inc.|| MMAU|C50899_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50899_02 - Honda Australia|| MMAU|C50899_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50899_03 - Honda Inc.|| MMAU|C51000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51000_01 - Genetec|| MMAU|C51118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_01 - ALSTOM|| MMAU|C51118_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_02 - ALSTOM|| MMAU|C51118_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_03 - ALSTOM|| MMAU|C51118_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_04 - ALSTOM|| MMAU|C51118_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_05 - ALSTOM|| MMAU|C51118_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_06 - ALSTOM|| MMAU|C51118_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_08 - ALSTOM|| MMAU|C51118_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_09 - ALSTOM|| MMAU|C51118_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_10 - ALSTOM|| MMAU|C51119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51119_01 - Alstom|| MMAU|C51144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51144_01 - AUDI|| MMAU|C51147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51147_01 - AUTOEUROPA|| MMAU|C51148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51148_01 - Autoliv Holding|| MMAU|C51149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51149_01 - Automotive|| MMAU|C51174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51174_01 - BMW Konzern|| MMAU|C51179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51179_01 - Bombardier_Adtranz|| MMAU|C51639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51639_01 - Toyota|| MMAU|C51664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51664_01 - Volkswagen|| MMAU|C51665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51665_01 - Volkswagen|| MMAU|C51666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51666_01 - Volvo|| MMAU|C51667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51667_01 - VOLVO|| MMAU|C51667_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51667_02 - VOLVO|| MMAU|C51667_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51667_03 - VOLVO|| MMAU|C51667_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51667_04 - VOLVO|| MMAU|C51667_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51667_05 - VOLVO|| MMAU|C51667_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51667_06 - VOLVO|| MMAU|C51667_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51667_11 - VOLVO|| MMAU|C51668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51668_01 - Volvo|| MMAU|C51669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51669_01 - Volvo Car Corporation|| MMAU|C51670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51670_01 - Volvo India PVT LTD|| MMAU|C51670_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51670_02 - Volvo India PVT LTD|| MMAU|C51671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51671_01 - Volvo Information Technology|| MMAU|C51721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51721_01 - MAQUINARIAS|| MMAU|C51731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51731_01 - BMW Manufacturing Co, LLC|| MMAU|C52064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C52064_01 - Falck Schmidt Defence System A/S|| MMAU|C51453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_01 - OTHERS - AUTOMOBILES|| MMAU|C51453_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_02 - OTHERS - AUTOMOBILES|| MMAU|C51453_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_03 - OTHERS - AUTOMOBILES|| MMAU|C51453_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_04 - OTHERS - AUTOMOBILES|| MMAU|C51453_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_05 - OTHERS - AUTOMOBILES|| MMAU|C51453_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_06 - OTHERS - AUTOMOBILES|| MMAU|C51453_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_08 - OTHERS - AUTOMOBILES|| MMAU|C51453_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_09 - OTHERS - AUTOMOBILES|| MMAU|C51453_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_11 - OTHERS - AUTOMOBILES|| MMAU|C51453_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_12 - OTHERS - AUTOMOBILES|| MMAU|C51482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_01 - PEUGEOT|| MMAU|C51482_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_02 - PEUGEOT|| MMAU|C51482_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_03 - PEUGEOT|| MMAU|C51482_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_04 - PEUGEOT|| MMAU|C51482_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_05 - PEUGEOT|| MMAU|C51482_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_06 - PEUGEOT|| MMAU|C51482_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_08 - PEUGEOT|| MMAU|C51482_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_09 - PEUGEOT|| MMAU|C51482_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_11 - PEUGEOT|| MMAU|C51482_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_12 - PEUGEOT|| MMAU|C51514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51514_01 - Renault|| MMAU|C51515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_01 - RENAULT - NISSAN|| MMAU|C51515_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_02 - RENAULT - NISSAN|| MMAU|C51515_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_03 - RENAULT - NISSAN|| MMAU|C51515_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_04 - RENAULT - NISSAN|| MMAU|C51515_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_05 - RENAULT - NISSAN|| MMAU|C51515_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_06 - RENAULT - NISSAN|| MMAU|C51515_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_08 - RENAULT - NISSAN|| MMAU|C51527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51527_01 - SAAB|| MMAU|C52197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C52197_01 - Nissens A/S|| MMAU|C60159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C60159_01 - Kia Canada|| MMAU|C60159_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C60159_02 - Kia Canada|| MMAU|C60198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C60198_01 - NISSAN MAQUINARIAS S.A|| MMAU|C81162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81162_01 - Goodyear Tire & Rubber Co.|| MMAU|C80355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C80355_01 - S.E.A.T., S.A.|| MMAU|C80564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C80564_01 - Mercedes|| MMAU|C80777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C80777_01 - Advance Engineered Products Ltd|| MMAU|C81374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81374_01 - Mazda Motor Logistics Europe|| MMAU|C10699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C10699_01 - Volkswagen Gedas|| MMAU|C59999_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C59999_10 - Other Sub Sector MMAU|| MMAU|C51270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51270_01 - Ford|| MMAU|C51488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51488_01 - Pilkington|| MMAU|C51717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51717_01 - FIRTH INDUSTRIES PERU S.A.|| MMAU|C51734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51734_01 - Automotive|| MMAU|C51736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51736_01 - Daimler Chrysler|| MMAU|C51737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51737_01 - Fordonsleverantorer|| MMAU|C51738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51738_01 - Renault|| MMAU|C51740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51740_01 - Volkswagen|| MMAU|C51741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51741_01 - Volvo|| MMAU|C51742_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51742_01 - Volvo Car Corporation|| MMAU|C51748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51748_01 - Alstom|| MMAU|C51755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51755_01 - Autoliv Holding|| MMAU|C51761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51761_01 - Bombardier_Adtranz|| MMAU|C51783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51783_01 - Kockums|| MMAU|C51803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51803_01 - Pilkington|| MMAU|C51807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51807_01 - SAAB|| MMAU|C50008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50008_01 - ABS Friction Inc.|| MMAU|C50063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50063_01 - Atelier Mécanique|| MMAU|C50128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50128_01 - Cambli International Inc.|| MMAU|C50154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50154_01 - CIM Limited|| MMAU|C50281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50281_01 - GDX Automotive Canada Inc.|| MMAU|C50507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50507_01 - PresGlas|| MMAU|C50568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50568_01 - Sargent Aerospace Canada Inc.|| MMAU|C50599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50599_01 - Spar Aerospace Limited|| MMAU|C50731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50731_01 - Camoplast|| MMAU|C50736_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50736_01 - Plydex, Division of Decoma|| MMAU|C51224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51224_01 - Daimler Chrysler|| MMAU|C51884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51884_01 - Toyota|| MMAU|C52176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C52176_01 - MAN Diesel A/S|| MMAU|C80624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C80624_01 - Ford|| MMAU|C81301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81301_01 - Ieh Auto Parts LLC|| MMAU|C81352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81352_01 - Interco|| MMAU|C81558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81558_01 - RaceChip Chiptuning GmbH & Co. KG|| MMAU|C81563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81563_01 - Goodyear Belgium|| MMAU|C81592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81592_01 - Daimler Trucks North America LLC|| MMAU|C81624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81624_01 - C. Reinhardt A/S|| MMAU|C81632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81632_01 - NORDISK D?K IMPORT A-S|| MMAU|C81711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81711_01 - Pearlchain|| MMAU|C81840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81840_01 - MANAC|| MMAU|C81842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81842_01 - PACCAR|| MMAU|C81926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C81926_01 - Burson Automotive Pty Ltd|| MMAU|C51548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51548_01 - Scania CV|| MMAU|C82042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82042_01 - Bombardier Produits R�cr�atifs|| MMAU|C82261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82261_01 - Pneus Robert Bernard Lt�e, Les|| MMAU|C82262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82262_01 - Camoplast|| MMAU|C82283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82283_01 - Motorfirman Holger Duell AB|| MMAU|C82476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82476_01 - CEVT(China Euro Vehicle Technology Aktie|| MMAU|C50554_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C50554_04 - Bombardierproduitsr�cr�atifs|| MMAU|C82513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82513_01 - Volkswagen Autoeuropa, Lda|| MMAU|C82835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82835_01 - EMS SATCOM UK LTD|| MMAU|C82925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C82925_01 - AmericanHondaMotorCompany|| MMAU|C83078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83078_01 - Federal Signal Corp|| MMAU|C83107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83107_01 - Federal Signal Corporation|| MMAU|C83145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83145_01 - Magna International Inc.|| MMAU|C83223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83223_01 - Ford Motor Company|| MMAU|C83244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83244_01 - Noakes Group Pty Limited|| MMAU|C51118_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51118_07 - ALSTOM|| MMAU|C51453_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51453_07 - OTHERS - AUTOMOBILES|| MMAU|C51482_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51482_07 - PEUGEOT|| MMAU|C51515_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C51515_07 - RENAULT - NISSAN|| MMAU|C70353_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C70353_02 - DCNS|| MMAU|C70353_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C70353_09 - DCNS|| MMAU|C70353_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C70353_12 - DCNS|| MMAU|C83547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83547_01 - Ford Motor Company|| MMAU|C83668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83668_01 - Daimler Trucks North America LLC|| MMAU|C83896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83896_01 - GMT INC.|| MMAU|C83941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C83941_01 - KHS|| MMAU|C84211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C84211_01 - Daimler Trucks North America LLC|| MMAU|C84307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMAU_Att|C84307_01 - Alfa|| Commercial_and_Industrial_Goods|MMHT|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMHT|C11063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11063_01 - McAfee, Inc.|| MMHT|C11179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11179_01 - BAE SYSTEMS|| MMHT|C31338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C31338_01 - BAE SYSTEMS|| MMHT|C50005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50005_01 - ABB Inc.|| MMHT|C50005_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50005_02 - ABB Inc.|| MMHT|C31612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C31612_01 - Siemens|| MMHT|C31613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C31613_01 - Siemens Aktiengesellschaft|| MMHT|C31639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C31639_01 - Systems Engineering & Assessment|| MMHT|C51191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51191_01 - Carillion Rail|| MMHT|C51247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51247_01 - Electrolux|| MMHT|C51285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51285_01 - Gambro|| MMHT|C51329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51329_01 - IT|| MMHT|C51402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51402_01 - Microsoft|| MMHT|C50493_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50493_02 - Phillips Van Heussen|| MMHT|C50581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50581_01 - Siemens Medical Solutions Diagnostics|| MMHT|C50729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50729_01 - Research Motion Limited|| MMHT|C50729_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50729_02 - RIM - Research in Motion|| MMHT|C50729_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50729_03 - RIM - Research in Motion|| MMHT|C50804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50804_01 - Navisys|| MMHT|C50838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50838_01 - CBD Inc.|| MMHT|C50915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50915_01 - Philips International B.V.|| MMHT|C50915_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50915_02 - Philips International B.V.|| MMHT|C50999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50999_01 - SMEG|| MMHT|C50999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50999_02 - SMEG|| MMHT|C50999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50999_03 - SMEG|| MMHT|C51024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51024_01 - Honeywell|| MMHT|C51158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51158_01 - BASF|| MMHT|C51181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51181_01 - Bosch|| MMHT|C51582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51582_01 - Sony Ericsson|| MMHT|C51584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51584_01 - ST MicroElectronics Private Ltd|| MMHT|C51584_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51584_02 - ST MicroElectronics Private Ltd|| MMHT|C51680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51680_01 - ABB|| MMHT|C51689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51689_01 - ASML|| MMHT|C51690_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51690_01 - Canon|| MMHT|C51703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51703_01 - Philips|| MMHT|C51705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51705_01 - Rest IS CS|| MMHT|C51955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51955_01 - Bluegarden A/S|| MMHT|C52086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52086_01 - GPBM Nordic AB|| MMHT|C52087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52087_01 - GPV International A/S|| MMHT|C52089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52089_01 - Gram A/S|| MMHT|C51487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51487_01 - Philips|| MMHT|C51523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51523_01 - Robert Bosch GmbH|| MMHT|C51563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51563_01 - Siemens|| MMHT|C70234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C70234_01 - ABB Transmission and Distribution LLC|| MMHT|C52169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52169_01 - MacArtney A/S|| MMHT|C52225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52225_01 - Phonak Danmark A/S|| MMHT|C52251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52251_01 - Samson Agro A/S|| MMHT|C52285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52285_01 - Spectronic Denmark A/S|| MMHT|C52342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52342_01 - Sepura plc|| MMHT|C60174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C60174_01 - BELLSTAR|| MMHT|C60221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C60221_01 - CISCO SYSTEMS AUSTRALIA PTY LTD|| MMHT|C80173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80173_01 - Siemens|| MMHT|C70421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C70421_01 - NSN|| MMHT|C80847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80847_01 - Photronics (UK) Ltd|| MMHT|C81071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81071_01 - BAE SYSTEMS|| MMHT|C80349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80349_01 - Spring Technology|| MMHT|C80351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80351_01 - Dell Products|| MMHT|C80401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80401_01 - BASF Corporation US|| MMHT|C80510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80510_01 - Canon|| MMHT|C80553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80553_01 - Konica_Minolta|| MMHT|C80584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80584_01 - Renishaw|| MMHT|C80622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80622_01 - Dell|| MMHT|C80768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80768_01 - UNISYSTEMS SYSTEMES INFORMATIQUES|| MMHT|C80786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80786_01 - Eastman Kodak Company|| MMHT|C80787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80787_01 - CAF SIGNALING S.L.|| MMHT|C81176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81176_01 - Fujitsu Technology Solutions S.A.|| MMHT|C81224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81224_01 - VECTOR SOFTWARE FACTORY, S.L|| MMHT|C81240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81240_01 - HWG Technologies and Solutions Australia|| MMHT|C81241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81241_01 - HWG AUSTRALIA INTERNAL|| MMHT|C81249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81249_01 - Exo-U Inc|| MMHT|C81250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81250_01 - TRIPL'A|| MMHT|C81442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81442_01 - Samsung Electronics Co., Ltd.|| MMHT|C10318_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10318_03 - Microsoft Corporation|| MMHT|C10318_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10318_05 - Microsoft Corporation|| MMHT|C10318_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10318_08 - Microsoft|| MMHT|C10536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10536_01 - Readsoft|| MMHT|C10618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10618_01 - TechnoMedia|| MMHT|C10719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10719_01 - AOL - America Online|| MMHT|C10739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10739_01 - Alten|| MMHT|C10165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10165_01 - DynaDocs - Dynamic Documents|| MMHT|C10165_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10165_02 - DynaDocs - Dynamic Documents|| MMHT|C10165_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10165_03 - DynaDocs - Dynamic Documents|| MMHT|C59999_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C59999_11 - Other Sub Sector MMHT|| MMHT|C80251_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80251_02 - ARM Limited|| MMHT|C80833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80833_01 - ARM Limited|| MMHT|C80262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80262_01 - ARM Maintenance|| MMHT|C10255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10255_01 - Open Text Corporation|| MMHT|C10267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10267_01 - Keystone Electronics Corporation|| MMHT|C60314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C60314_01 - Pitney Bowes of Canada Ltd.|| MMHT|C60314_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C60314_02 - Pitney Bowes of Canada Ltd.|| MMHT|C80248_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80248_02 - CISCO SYSTEMS INC|| MMHT|C80671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80671_01 - Blackberry|| MMHT|C80671_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80671_02 - Blackberry|| MMHT|C11101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11101_01 - Allegro Software Development Corporation|| MMHT|C10959_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10959_02 - N. Harris Computer Corp.|| MMHT|C10959_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10959_03 - Harris, N. Computer Corporation|| MMHT|C10950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10950_01 - VMware|| MMHT|C11032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11032_01 - Oracle Canada ULC - Vancouver|| MMHT|C11014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11014_01 - Merced Systems Limited|| MMHT|C11016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11016_01 - Mansystems Deutschland GmbH|| MMHT|C11017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11017_01 - OptixOne GmbH and Co. KG|| MMHT|C81491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81491_01 - Ipswitch, Inc|| MMHT|C10318_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10318_09 - MICROSOFT IRELAND OPER. LIMITED'S IRISH|| MMHT|C81516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81516_01 - KYOCERA Document Solutions Europe B.V.|| MMHT|C81540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81540_01 - Hitachi Data Systems|| MMHT|C20917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C20917_01 - AOL - America Online|| MMHT|C51323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51323_01 - Infineon|| MMHT|C51708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51708_01 - ABB S.A.|| MMHT|C51745_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51745_01 - ABB|| MMHT|C51766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51766_01 - Electrolux|| MMHT|C51770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51770_01 - Gambro|| MMHT|C51802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51802_01 - Philips|| MMHT|C51814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51814_01 - Siemens|| MMHT|C51817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51817_01 - Sony Ericsson|| MMHT|C51828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51828_01 - Carillion Rail|| MMHT|C50224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50224_01 - Ecosys Canada Inc.|| MMHT|C50408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50408_01 - Megatech Electro|| MMHT|C50657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50657_01 - Tyco|| MMHT|C50884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C50884_01 - Ortec|| MMHT|C51074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51074_01 - Austriamicrosystems AG|| MMHT|C60319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C60319_01 - SAS Institute Software Lda. (Portugal)|| MMHT|C80422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80422_01 - Equinix Service Ltd|| MMHT|C80422_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80422_02 - Equinix Service Ltd|| MMHT|C80422_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80422_03 - Equinix Service Ltd|| MMHT|C80878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80878_01 - Kaifa Technology (H.K.) Trading Limited|| MMHT|C10348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10348_01 - Notarius Inc.|| MMHT|C10349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10349_01 - Olympus|| MMHT|C10356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10356_01 - OS Communication Informatiques Inc.|| MMHT|C10371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10371_01 - Prescient Infotech Inc.|| MMHT|C10380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10380_01 - ProVision IT Resources Ltd|| MMHT|C10384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10384_01 - QStrat Inc.|| MMHT|C10386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10386_01 - Quatech Systems Ltd|| MMHT|C10410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10410_01 - SAP Labs Inc.|| MMHT|C10542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10542_01 - NCR Espana|| MMHT|C10657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10657_01 - New Technologies Inc.|| MMHT|C10714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10714_01 - QNX Software Systems|| MMHT|C51538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51538_01 - SAP APAC|| MMHT|C52320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52320_01 - VELUX A/S IT Department|| MMHT|C70345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C70345_01 - Flextronics|| MMHT|C80438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80438_01 - SONY|| MMHT|C80438_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80438_02 - SONY|| MMHT|C80438_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C80438_03 - SONY|| MMHT|C81063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81063_01 - XEROX (UK) LIMITED|| MMHT|C10164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10164_01 - Dynacom Technologies Inc.|| MMHT|C10173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10173_01 - Elluminate Inc.|| MMHT|C10203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10203_01 - Gameloft Inc.|| MMHT|C10242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10242_01 - Icam Technologies Corporation|| MMHT|C10291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10291_01 - Logiciels Sports-Plus Inc.|| MMHT|C10324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10324_01 - MLC Worldwide Inc.|| MMHT|C10861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10861_01 - Computronix Ltd|| MMHT|C10868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10868_01 - Coradiant Inc.|| MMHT|C10946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10946_01 - Cipheroptics|| MMHT|C10965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C10965_01 - Motorola Solutions Inc.|| MMHT|C11027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C11027_01 - Mutual Concept Computer Group Inc.|| MMHT|C22261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C22261_01 - IBM de Venezuela, S.A.|| MMHT|C22279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C22279_01 - Oracle de Venezuela, C.A.|| MMHT|C51892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51892_01 - IT|| MMHT|C52125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C52125_01 - Intracom IT Services|| MMHT|C70630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C70630_01 - Flextronics|| MMHT|C81540_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81540_02 - Hitachi Data Systems|| MMHT|C81540_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81540_03 - Hitachi Data Systems AS|| MMHT|C81641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81641_01 - Dnp Denmark as|| MMHT|C81540_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81540_04 - Hitachi Data Systems Corporation|| MMHT|C81850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81850_01 - MACDONALD,DETTWILER|| MMHT|C81900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81900_01 - Siemens AS|| MMHT|C81540_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81540_05 - Hitachi Data Systems Inc.|| MMHT|C51426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C51426_01 - Nokia Inc.|| MMHT|C81931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81931_01 - VGS Services (Canada) Inc|| MMHT|C81951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81951_01 - LINKBYNET|| MMHT|C81969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C81969_01 - OPIN|| MMHT|C82008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82008_01 - Manex|| MMHT|C82011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82011_01 - Outsystems Benelux|| MMHT|C82023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C82023_01 - Microsoft Corporation|| MMHT|C82089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82089_01 - Dustin Sverige AB|| MMHT|C82109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82109_01 - BAE Systems H�gglunds AB|| MMHT|C82161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82161_01 - Xerox Business Services, LLC|| MMHT|C82190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82190_01 - i4bi|| MMHT|C82218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82218_01 - Microsoft Mobile Oy|| MMHT|C82264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82264_01 - PrimeKey Labs GmbH|| MMHT|C82285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82285_01 - N-Allo|| MMHT|C82297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82297_01 - Merit Consulting AB|| MMHT|C82323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82323_01 - Hypergene AB|| MMHT|C82360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82360_01 - WAGTEC PTY LTD|| MMHT|C82394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82394_01 - Intel Security|| MMHT|C82395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82395_01 - Eclipsys Solutins Inc.|| MMHT|C82396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82396_01 - Blackline Systems Corp.|| MMHT|C82398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82398_01 - Unit4 Business Software Corporation|| MMHT|C82400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82400_01 - Real Dolmen NV/SA|| MMHT|C82408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82408_01 - TLE Electrical|| MMHT|C82439_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82439_01 - Honeywell Control Systems Ltd|| MMHT|C82501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82501_01 - NXP|| MMHT|C82528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82528_01 - Mitsubishi Hitachi Power Systems Europe|| MMHT|C82546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82546_01 - Cisco - Toronto|| MMHT|C82564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82564_01 - Valmet Ltée|| MMHT|C82572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82572_01 - Qwest Information Technologies|| MMHT|C82629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82629_01 - Eastman Kodak Company|| MMHT|C82746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82746_01 - LOCKHEED MARTIN IT|| MMHT|C82761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82761_01 - KODAK ALARIS INC.|| MMHT|C82766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82766_01 - Trasys SA|| MMHT|C82771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82771_01 - Track-Group Analytics|| MMHT|C82789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82789_01 - Hitachi Data Systems Inc.|| MMHT|C82791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82791_01 - Les SystFmes Cisco Canada Cie|| MMHT|C82792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82792_01 - INGTECH|| MMHT|C82796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82796_01 - NEGOTIUM technologie inc.|| MMHT|C82808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82808_01 - IBML|| MMHT|C82833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82833_01 - Castle|| MMHT|C82840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82840_01 - VTT,Technical Research Centre of Finland|| MMHT|C82845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82845_01 - Hexagon|| MMHT|C82875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82875_01 - INTEL AMERICAS, INC.|| MMHT|C82876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82876_01 - DynaDocs - Shared (Dummy)|| MMHT|C82880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82880_01 - AffiliatedComputerServicesInc|| MMHT|C82918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82918_01 - MI9BUSINESSINTELLILGENCESYS|| MMHT|C82920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82920_01 - PROFDATASOLUTIONS(PDI)|| MMHT|C82943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82943_01 - SHI International Corp|| MMHT|C82958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C82958_01 - Checkpoint_US|| MMHT|C83010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83010_01 - Dell Marketing LP|| MMHT|C83015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83015_01 - Automic Software Inc.|| MMHT|C83074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83074_01 - Mitsubishi Space Software Co., Ltd.|| MMHT|C83105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83105_01 - HWG Technologies and Solutions Australia|| MMHT|C83115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83115_01 - Ultra Electronics TCS|| MMHT|C83298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83298_01 - Allegro Software Development Corporation|| MMHT|C83351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83351_01 - GPS Insight, llc|| MMHT|C83355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83355_01 - Voxtel|| MMHT|C83397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83397_01 - IBML|| MMHT|C83469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83469_01 - Voxtel|| MMHT|C83480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83480_01 - Analog Devices|| MMHT|C83556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83556_01 - Digital Globe Services, Inc|| MMHT|C83586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83586_01 - ABB inc|| MMHT|C83593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83593_01 - Targa Systems Division L-3 Communication|| MMHT|C83640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83640_01 - Guestlogix|| MMHT|C83662_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83662_01 - Phillips Van Heussen|| MMHT|C83922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C83922_01 - IBML|| MMHT|C84046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C84046_01 - Qwest Information Technologies|| MMHT|C84174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C84174_01 - Blackberry|| MMHT|C84200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C84200_01 - Phillips Van Heussen|| MMHT|C84209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C84209_01 - Aerojet Rocketdyne Holdings, Inc.|| MMHT|C84395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMHT_Att|C84395_01 - THERMO FISHER SCIENTIFIC|| Commercial_and_Industrial_Goods|MMIP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMIP|C22332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C22332_01 - S and K Group A/S|| MMIP|C31541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C31541_01 - Mitsubishi Electric Corp|| MMIP|C40408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C40408_01 - Fiskars|| MMIP|C50020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50020_01 - ABCRC - Alberta Beverage Container Recycling Corporation|| MMIP|C31611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C31611_01 - SES Engineering US (Inc.)|| MMIP|C51190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51190_01 - Cargotec Oyj|| MMIP|C51205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51205_01 - COCHLEAR LIMITED|| MMIP|C51255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51255_01 - Ergolet A/S|| MMIP|C51267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51267_01 - Flexit AS|| MMIP|C51275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51275_01 - Framo Engineering AS|| MMIP|C51287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51287_01 - Getinge|| MMIP|C51290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51290_01 - Glaston Oyj Abp|| MMIP|C51291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51291_01 - GN Otometrics A/S|| MMIP|C51301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51301_01 - Hilding Anders|| MMIP|C51458_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_02 - OTHERS - MANUFACTURING|| MMIP|C51458_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_03 - OTHERS - MANUFACTURING|| MMIP|C51458_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_04 - OTHERS - MANUFACTURING|| MMIP|C51458_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_05 - OTHERS - MANUFACTURING|| MMIP|C51458_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_06 - OTHERS - MANUFACTURING|| MMIP|C51458_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_07 - OTHERS - BU_France_Manufacturing|| MMIP|C51458_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_08 - OTHERS - BU_France_Manufacturing|| MMIP|C51458_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_09 - OTHERS - BU_France_Manufacturing|| MMIP|C51458_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_11 - OTHERS - BU_France_Manufacturing|| MMIP|C51458_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_12 - OTHERS - BU_France_Manufacturing|| MMIP|C51464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51464_01 - Others M R D|| MMIP|C51465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51465_01 - Others Manufacturing, Retail & Distribution|| MMIP|C51467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51467_01 - Oticon A/S|| MMIP|C51529_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_01 - SAINT GOBAIN|| MMIP|C51529_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_02 - SAINT GOBAIN|| MMIP|C51529_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_03 - SAINT GOBAIN|| MMIP|C51529_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_04 - SAINT GOBAIN|| MMIP|C51529_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_05 - SAINT GOBAIN|| MMIP|C51529_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_06 - SAINT GOBAIN|| MMIP|C51529_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_08 - SAINT GOBAIN|| MMIP|C51529_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_12 - SAINT GOBAIN|| MMIP|C51530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51530_01 - Saint-Gobain|| MMIP|C51533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51533_01 - Sandvik|| MMIP|C51537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51537_01 - Sanovo Technology A/S|| MMIP|C51561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51561_01 - Setra|| MMIP|C51570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51570_01 - SKF Sverige AB|| MMIP|C52122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52122_01 - Ingeniørfirmaet Lytzen A/S|| MMIP|C52140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52140_01 - Klingspor A/S|| MMIP|C52141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52141_01 - Knauf A/S|| MMIP|C52153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52153_01 - Le Klint A/S|| MMIP|C52184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52184_01 - MIL-TEK Danmark A/S|| MMIP|C52192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52192_01 - n. eilersen A/S|| MMIP|C52204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52204_01 - Notio Direct Xpress A/S|| MMIP|C52218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52218_01 - PE|| MMIP|C52222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52222_01 - Persolit Entreprenørfirma A/S|| MMIP|C52223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52223_01 - Peter Krabbe Holding A/S|| MMIP|C52230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52230_01 - Povl Klitgaard and Co. Aps|| MMIP|C52239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52239_01 - RC Betonvarer A/S|| MMIP|C52248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52248_01 - Ruko A/S|| MMIP|C52260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52260_01 - Scanglas A/S|| MMIP|C52266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52266_01 - Schneider Electric Buildings|| MMIP|C52267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52267_01 - Schneider Electric Buildings Finland OY|| MMIP|C52268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52268_01 - Schneider Electric Buildings Norway AS|| MMIP|C52270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52270_01 - Secop GmbH|| MMIP|C52273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52273_01 - SFK System A/S|| MMIP|C52282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52282_01 - Sondex A/S|| MMIP|C52287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52287_01 - ST Skoleinventar A/S|| MMIP|C52289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52289_01 - Strandhave Værktøj og maskiner|| MMIP|C52298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52298_01 - Tempur-Pedic Management Inc.|| MMIP|C52301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52301_01 - Time Export A/S|| MMIP|C52308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52308_01 - Tvilum|| MMIP|C52310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52310_01 - Unidrain A/S|| MMIP|C52325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52325_01 - Vola A/S|| MMIP|C52327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52327_01 - VTI Vinderup Træindustri A/S|| MMIP|C52337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52337_01 - BEACON LIGHTING|| MMIP|C52338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52338_01 - STRAMIT BUILDING PRODUCTS PTY LTD|| MMIP|C59999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C59999_01 - Other Sub Sector MMDM (old sub-sector)|| MMIP|C70335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C70335_01 - ERG|| MMIP|C70468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C70468_01 - Schmidlin|| MMIP|C81125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81125_01 - MITSUBISHI ELECTRIC CORP|| MMIP|C81138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81138_01 - SES Engineering US (Inc)|| MMIP|C80366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C80366_01 - Mr Robert Conway|| MMIP|C81289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81289_01 - IndustrialScientificCorporation|| MMIP|C81295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81295_01 - 3MCompany|| MMIP|C81302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81302_01 - MeublesFoliotInc|| MMIP|C51307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51307_01 - HUNTER DOUGLAS LIMITED|| MMIP|C51309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51309_01 - Husqvarna|| MMIP|C51315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51315_01 - ICM-Arsima A/S|| MMIP|C51322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51322_01 - Industrial|| MMIP|C51334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51334_01 - JCB|| MMIP|C51341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51341_01 - Kaefer|| MMIP|C51350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51350_01 - KION|| MMIP|C51366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_01 - LAFARGE|| MMIP|C51366_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_02 - LAFARGE|| MMIP|C51366_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_03 - LAFARGE|| MMIP|C51366_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_04 - LAFARGE|| MMIP|C51366_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_05 - LAFARGE|| MMIP|C51366_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_06 - LAFARGE|| MMIP|C51366_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_08 - LAFARGE|| MMIP|C51366_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_11 - LAFARGE|| MMIP|C51369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51369_01 - Låsepartner A/S|| MMIP|C51419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51419_01 - Nederman Holding AB|| MMIP|C51427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51427_01 - Nordic Waterproofing Oy|| MMIP|C51446_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51446_01 - Other ? Manufacturing Retail and Distribution|| MMIP|C51447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51447_01 - Other - Manufacturing, Retail & Distribution|| MMIP|C51448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51448_01 - Other - Manufacturing, Retail & Distribution|| MMIP|C51449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51449_01 - Other - Manufacturing, Retail & Distribution|| MMIP|C51450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51450_01 - Other - Manufacturing, Retail & Distribution|| MMIP|C50325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50325_01 - Industries Cable d'acier|| MMIP|C50374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50374_01 - Les Produits Verriers Novatech|| MMIP|C50452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50452_01 - Novatech Group Inc.|| MMIP|C50452_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50452_02 - Novatech Group Inc.|| MMIP|C50707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50707_01 - Teknion Corporation|| MMIP|C50707_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50707_02 - Teknion UK Ltd|| MMIP|C50707_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50707_03 - Teknion Furniture Systems|| MMIP|C50711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50711_01 - Italcementi|| MMIP|C50797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50797_01 - AB Restructuring|| MMIP|C50810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50810_01 - Gienow Windows and Doors Ltd. Partners|| MMIP|C50836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50836_01 - 3M US - HQ|| MMIP|C50836_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50836_02 - 3M US - HQ|| MMIP|C50836_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50836_03 - 3M US - HQ|| MMIP|C50836_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50836_04 - 3M Poland Sp. z o.o.|| MMIP|C50842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50842_01 - JMY Inc.|| MMIP|C50951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50951_01 - Multiver|| MMIP|C51001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51001_01 - Shorts Brothers|| MMIP|C51036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51036_01 - Mitsubishi Electric and Electronics USA|| MMIP|C51068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51068_01 - Maibec|| MMIP|C51117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51117_01 - Alfa Laval|| MMIP|C51136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51136_01 - ASSA Abloy|| MMIP|C51142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51142_01 - Aubo Production A/S|| MMIP|C51145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51145_01 - Aura Light International|| MMIP|C51183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51183_01 - Brio Lek & Lar|| MMIP|C51590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51590_01 - Steinhoff|| MMIP|C51627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51627_01 - Thorn Lighting|| MMIP|C51629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51629_01 - ThyssenKrupp|| MMIP|C51651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51651_01 - TTS Group ASA|| MMIP|C51681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51681_01 - Abloy Oy|| MMIP|C51692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51692_01 - DSM|| MMIP|C51697_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51697_01 - Other Manufacturing|| MMIP|C51787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51787_01 - Manufacturing|| MMIP|C51811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51811_01 - Schneider Electric|| MMIP|C51939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51939_01 - Bella Moda|| MMIP|C51951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51951_01 - Blokeret - Assa Abloy UK Ltd. - overgivet til inkasso|| MMIP|C51956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51956_01 - BMS A/S|| MMIP|C51964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51964_01 - Brüel International A/S|| MMIP|C51966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51966_01 - BSV krantilbehør A/S|| MMIP|C51967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51967_01 - Budweg Caliper A/S|| MMIP|C51972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51972_01 - Buus Køleteknik A/S|| MMIP|C51980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51980_01 - Carl Hansen and Søn|| MMIP|C51988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51988_01 - Cembrit A/S|| MMIP|C52001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52001_01 - Crawford Production Denmark A/S|| MMIP|C52003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52003_01 - Dameca a/s|| MMIP|C52004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52004_01 - Dan-Foam Aps|| MMIP|C52005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52005_01 - Danfoss A/S|| MMIP|C52021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52021_01 - Dantherm Air Handling A/S|| MMIP|C52022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52022_01 - Dan-Web Machinery A/S|| MMIP|C52037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52037_01 - E and P Service ApS|| MMIP|C52040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52040_01 - EagleBurgmann KE A/S|| MMIP|C52044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52044_01 - Effimat Storage Technology A/S|| MMIP|C52045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52045_01 - EGERNSUND TEGL a.m.b.a.|| MMIP|C52051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52051_01 - Ellab A/S|| MMIP|C52070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52070_01 - Frejlev Cementstøberi A/S|| MMIP|C52074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52074_01 - Fumac A/S|| MMIP|C52084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52084_01 - Glunz and Jensen A/S|| MMIP|C52090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52090_01 - Gram Equipment A/S|| MMIP|C52101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52101_01 - HGH|| MMIP|C52102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C52102_01 - Hilti Danmark A/S|| MMIP|C51451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51451_01 - Other - Manufacturing, Retail & Distribution|| MMIP|C51452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51452_01 - Other Manufacturing, Retail and Distribution|| MMIP|C51457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_01 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_02 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_03 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_04 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_05 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_06 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_07 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_08 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_09 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_10 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_11 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51457_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_12 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_01 - OTHERS - MANUFACTURING|| MMIP|C59999_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C59999_12 - Other Sub Sector MMIP|| MMIP|C50504_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50504_02 - PPG Canada Inc.|| MMIP|C10747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10747_01 - Encorp Pacific|| MMIP|C60231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C60231_01 - CNH America LLC|| MMIP|C60231_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C60231_02 - CNH America LLC|| MMIP|C81125_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81125_02 - MITSUBISHI ELECTRIC CORP|| MMIP|C81544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81544_01 - WURTH FRANCE SA|| MMIP|C51240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51240_01 - DSM|| MMIP|C51763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51763_01 - DSM|| MMIP|C51248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51248_01 - Elekta|| MMIP|C51256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51256_01 - Esselte Group Holdings|| MMIP|C51297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51297_01 - Gyproc|| MMIP|C51300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51300_01 - Hellermann Tyton|| MMIP|C51343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51343_01 - Kalmar Industries|| MMIP|C51412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51412_01 - MunkforsSagar|| MMIP|C51468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51468_01 - OTIS|| MMIP|C51524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51524_01 - ROCA|| MMIP|C51545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51545_01 - Scancem|| MMIP|C51714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51714_01 - CORP.PERUANA DE PRODUCTOS QUIMICOS SA|| MMIP|C51716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51716_01 - Ferreyros S.A.A.|| MMIP|C51747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51747_01 - Alfa Laval|| MMIP|C51751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51751_01 - ASSA Abloy|| MMIP|C51754_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51754_01 - Aura Light International|| MMIP|C51764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51764_01 - Dynapac|| MMIP|C51767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51767_01 - Elekta|| MMIP|C51771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51771_01 - Getinge|| MMIP|C51774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51774_01 - Gyproc|| MMIP|C51776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51776_01 - Hellermann Tyton|| MMIP|C51778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51778_01 - Husqvarna|| MMIP|C51779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51779_01 - Industrial|| MMIP|C51781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51781_01 - Kalmar Industries|| MMIP|C51792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51792_01 - MunkforsSagar|| MMIP|C51808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51808_01 - Sandvik|| MMIP|C51813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51813_01 - Setra|| MMIP|C51815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51815_01 - SKF Sverige AB|| MMIP|C51849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51849_01 - Brio Lek & Lar|| MMIP|C51858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51858_01 - Hilding Anders|| MMIP|C51873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51873_01 - Saint-Gobain|| MMIP|C50015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50015_01 - AEP Canada Inc.|| MMIP|C50026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50026_01 - Societe en commandite Noranda|| MMIP|C50029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50029_01 - Moulure Alexandria Moulding|| MMIP|C50053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50053_01 - Armstrong World Industries|| MMIP|C50067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50067_01 - Atlantic Yarns Inc.|| MMIP|C50072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50072_01 - Ballard Power Systems Inc.|| MMIP|C50081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50081_01 - Bellivo Transformation Inc.|| MMIP|C50083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50083_01 - Bericap|| MMIP|C50085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50085_01 - Béton Saint-Hubert|| MMIP|C50101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50101_01 - Bolduc Leroux Inc.|| MMIP|C50164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50164_01 - Colacem Canada Inc.|| MMIP|C50175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50175_01 - Controle et production Usine Saguenay|| MMIP|C50211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50211_01 - Don Park Inc.|| MMIP|C50248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50248_01 - EPM|| MMIP|C50279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50279_01 - Garant Inc.|| MMIP|C50300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50300_01 - Groupe Bermex Inc.|| MMIP|C50301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50301_01 - Groupe BMR Inc.|| MMIP|C50307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50307_01 - Hewitt Ltd|| MMIP|C50324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50324_01 - Industrie Promag Inc.|| MMIP|C50327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50327_01 - Industries Mailhot|| MMIP|C50347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50347_01 - Kaba IIco Inc.|| MMIP|C50349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50349_01 - Kaycan|| MMIP|C50360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50360_01 - L.M.P.I.|| MMIP|C50365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50365_01 - Lear (Whitby) Seating Canada|| MMIP|C50366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50366_01 - Lego Centre de finition Inc.|| MMIP|C50367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50367_01 - Les aciers Canam|| MMIP|C50372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50372_01 - Les industries mondiales Armstrong|| MMIP|C50386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50386_01 - Mac Closures|| MMIP|C50409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50409_01 - Menuiserox Inc.|| MMIP|C50463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50463_01 - Orchard View Living Center|| MMIP|C50476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50476_01 - Pelican|| MMIP|C50483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50483_01 - Perma Savings Stone|| MMIP|C50541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50541_01 - Relizon Canada|| MMIP|C50561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50561_01 - Royal International Corp.|| MMIP|C50574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50574_01 - Semmaterials|| MMIP|C50587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50587_01 - Sivaco Québec|| MMIP|C50593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50593_01 - Soleno|| MMIP|C50612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50612_01 - Structures D.L.D. Ltée|| MMIP|C50613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50613_01 - Sun Company|| MMIP|C50625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50625_01 - Tayco Panneling|| MMIP|C50629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50629_01 - Teknion Roy and Breton Inc. (30)|| MMIP|C50634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50634_01 - The Wellington|| MMIP|C50659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50659_01 - Uniboard Canada Inc.|| MMIP|C50659_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50659_02 - Uniboard Canada Inc.|| MMIP|C50660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50660_01 - Unical|| MMIP|C50666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50666_01 - Veranda Jardin R.P. Inc.|| MMIP|C50724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50724_01 - Techcraft Manufacturing|| MMIP|C50730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50730_01 - Alberta Envirofuels|| MMIP|C50730_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50730_02 - Alberta Envirofuels|| MMIP|C50735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50735_01 - Meubles Dinec Inc.|| MMIP|C50789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50789_01 - Ceratec Inc.|| MMIP|C50792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50792_01 - Industries Spectra Premium Inc.|| MMIP|C50793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50793_01 - AGC Flat Glass Europe|| MMIP|C50830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50830_01 - Royal Welding|| MMIP|C50861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50861_01 - Davie Yards|| MMIP|C50896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50896_01 - Portes Lemieux|| MMIP|C50913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50913_01 - Hastings Deering (Australia) Pty Ltd|| MMIP|C50926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50926_01 - Montel Inc.|| MMIP|C50942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50942_01 - Béton Provincial|| MMIP|C50957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50957_01 - Bain Magique|| MMIP|C50957_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50957_02 - Bain Magique|| MMIP|C50962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C50962_01 - IEL - Les Industries et Équipements Laliberté Inc.|| MMIP|C51013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51013_01 - Mantissa Corporation|| MMIP|C51067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51067_01 - Groupe Prommel|| MMIP|C51079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51079_01 - 4361814 Canada Inc. / Noble|| MMIP|C51242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51242_01 - Dynapac|| MMIP|C60335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C60335_01 - SUPERIOR PAK PTY LTD|| MMIP|C10454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10454_01 - Streetlight Technologies|| MMIP|C10497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10497_01 - Venmar CES Inc.|| MMIP|C10561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10561_01 - equipements Mauvalin Inc.|| MMIP|C10669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10669_01 - Standard Register Company|| MMIP|C51620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51620_01 - Tempcold|| MMIP|C51839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51839_01 - Tempcold|| MMIP|C51883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51883_01 - Thorn Lighting|| MMIP|C51932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51932_01 - AVK International A/S|| MMIP|C60172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C60172_01 - ANCRO SRL|| MMIP|C70479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C70479_01 - SRS ELECTRIC PTY LTD|| MMIP|C80800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C80800_01 - Unisystems|| MMIP|C10072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10072_01 - Bowling Green Metalforming|| MMIP|C10084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10084_01 - Cadres Verbec Inc.|| MMIP|C10099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10099_01 - Central Precast Inc.|| MMIP|C10285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10285_01 - Les parquets Dubeau|| MMIP|C10310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10310_01 - Maximum Inc.|| MMIP|C10344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10344_01 - North Safety Products|| MMIP|C10802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10802_01 - Carmichael|| MMIP|C10847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C10847_01 - Proval|| MMIP|C51140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51140_01 - Atlas Copco Group|| MMIP|C81581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81581_01 - GRP DESCHESNES|| MMIP|C81645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81645_01 - Hedensted Gruppen A/S|| MMIP|C81650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81650_01 - Fomaco A/S|| MMIP|C81660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81660_01 - Treh?je D?re A/S|| MMIP|C81662_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81662_01 - Widex A/S|| MMIP|C81651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81651_01 - Scada International ApS|| MMIP|C81707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81707_01 - Exar Corporation|| MMIP|C81720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81720_01 - Fast Automation Pty Ltd|| MMIP|C81725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81725_01 - SIEMENS (A.B.N. 98 004 347 880)|| MMIP|C81726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81726_01 - SJ Electric Group (QLD) Pty Ltd|| MMIP|C81772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81772_01 - Hagen AS|| MMIP|C81846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81846_01 - BATH FITTER|| MMIP|C81882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81882_01 - Tractafric Equipment Africa|| MMIP|C81891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81891_01 - Kaba M?llerUndall AS|| MMIP|C81907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81907_01 - Techo-Bloc|| MMIP|C51266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51266_01 - Fiskars Oyj Abp|| MMIP|C81975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMME_Att|C81975_01 - IFASTGROUP INC.|| MMIP|C81976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C81976_01 - TARKETT USA INC.|| MMIP|C82012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82012_01 - Plakabeton|| MMIP|C22123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C22123_01 - ACOME|| MMIP|C22123_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C22123_12 - ACOME|| MMIP|C82028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82028_01 - OTIS Elevator Compnay|| MMIP|C82108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82108_01 - �l� AB|| MMIP|C82111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82111_01 - Svenska F�nster AB|| MMIP|C82112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82112_01 - TPPG The Perimeter Protection Group AB|| MMIP|C82127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82127_01 - Moelven Modus AB|| MMIP|C82213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82213_01 - Indutrade Oy|| MMIP|C82219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82219_01 - Normet Group Oy|| MMIP|C82224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82224_01 - Peikko Group Oy|| MMIP|C82231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82231_01 - Rotator Oy|| MMIP|C82249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82249_01 - Matthews International Corporation|| MMIP|C82255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82255_01 - Matthews International Corporation|| MMIP|C82263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82263_01 - HAGER ELECTRO GMBH AND CO KG|| MMIP|C82274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82274_01 - Konga Mekaniska Verkstad AB|| MMIP|C82311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82311_01 - Nord-Lock International AB|| MMIP|C82370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82370_01 - Rectifier Technologies Pacific Pty Ltd.|| MMIP|C82529_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82529_01 - LINAK A/S|| MMIP|C82544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82544_01 - Sandvik|| MMIP|C82692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82692_01 - CNH America LLC|| MMIP|C82824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82824_01 - BAMA Werkzeug und Maschinenhandel GmbH|| MMIP|C82834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C82834_01 - CONVEX|| MMIP|C83051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83051_01 - Camso Inc.|| MMIP|C83093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83093_01 - Atlas Copco Airpower n.v.|| MMIP|C83104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83104_01 - SRS Electric NSW Pty Ltd|| MMIP|C83113_01|StoreData|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83113_01 - Tyco|| MMIP|C83254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83254_01 - McInnis Cement|| MMIP|C83285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83285_01 - Aasted Aps|| MMIP|C83237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83237_01 - SCHNEIDER ELECTRIC INDUSTRIES SAS|| MMIP|C83239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83239_01 - SCHNEIDER ELECTRIC INDUSTRIES SAS|| MMIP|C83240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83240_01 - SCHNEIDER ELECTRIC FRANCE|| MMIP|C83241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83241_01 - SCHNEIDER ELECTRIC INDUSTRIES SAS|| MMIP|C83335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83335_01 - Moelven Modus|| MMIP|C83365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83365_01 - LGI|| MMIP|C83369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83369_01 - SKF|| MMIP|C51366_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51366_07 - LAFARGE|| MMIP|C51457_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51457_13 - OTHERS - ENTREPRISES SERVICES|| MMIP|C51458_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_10 - OTHERS - MANUFACTURING|| MMIP|C51458_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51458_13 - OTHERS - MANUFACTURING|| MMIP|C51529_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C51529_07 - SAINT GOBAIN|| MMIP|C70530_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C70530_07 - SCHNEIDER|| MMIP|C75030_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C75030_02 - SCHNEIDER|| MMIP|C75030_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C75030_11 - SCHNEIDER|| MMIP|C83407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83407_01 - Techno-Bloc|| MMIP|C83424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83424_01 - Kingspan Ltd|| MMIP|C83432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83432_01 - OTHERS - ENTREPRISES SERVICES|| MMIP|C83439_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83439_01 - OTHERS - MANUFACTURING|| MMIP|C31575_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C31575_02 - SCHNEIDER|| MMIP|C31575_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C31575_07 - SCHNEIDER|| MMIP|C31575_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C31575_11 - SCHNEIDER|| MMIP|C83535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83535_01 - The Crosby Group of New Hampshire, LLC|| MMIP|C83543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83543_01 - Watts Water Technologies EMEA B.V.|| MMIP|C83544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83544_01 - Watts Water Technologies, Inc.|| MMIP|C83576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83576_01 - Laerdal Medical AS|| MMIP|C83601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83601_01 - HTC Limited|| MMIP|C83611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83611_01 - HTC Limited|| MMIP|C83680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83680_01 - STATNI TISKARNA CENIN, statni podnik|| MMIP|C83905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83905_01 - HALL DRILLING, LLC|| MMIP|C83942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83942_01 - KINZER DRILLING|| MMIP|C83950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C83950_01 - LKQ MANAGEMENT COMPANY|| MMIP|C84203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C84203_01 - MSC Industrial Supply Co.|| MMIP|C21926_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C21926_02 - BIC|| MMIP|C21926_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C21926_07 - BIC|| MMIP|C84239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C84239_01 - Honda Lock|| MMIP|C84243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C84243_01 - Mueller Co.|| MMIP|C84296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C84296_01 - Sundyne|| MMIP|C84316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C84316_01 - Castle Building Centres Group Ltd.|| MMIP|C84386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C84386_01 - Carrier Corporation|| MMIP|C84412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMIP_Att|C84412_01 - Husqvarna Consumer Outdoor Products N.A.|| MRD|Oil_and_Gas|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Oil and Gas|| Oil_and_Gas|MMOG|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| MMOG|C11148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C11148_01 - Nexen Petroleum U.K. Ltd|| MMOG|C11158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C11158_01 - Shell|| MMOG|C11159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C11159_01 - Shell|| MMOG|C11169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C11169_01 - The Weir Group plc|| MMOG|C50012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50012_01 - Advantage Oil and Gas Ltd|| MMOG|C50014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50014_01 - AECO Gas Storage Partnership|| MMOG|C50031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50031_01 - Alliance Pipeline Limited|| MMOG|C50048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50048_01 - Arc Resources Limited|| MMOG|C50056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50056_01 - C50056_01 - Arsenal Energy Inc.|| MMOG|C50089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50089_01 - Birch Cliff Energy|| MMOG|C50104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50104_01 - Bonterra Energy Corp.|| MMOG|C50135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50135_01 - Canadian Natural Resources Ltd|| MMOG|C50167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50167_01 - Compton Petroleum Corporation|| MMOG|C50173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50173_01 - ConocoPhillips Canada|| MMOG|C50201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50201_01 - Devon Canada Corporation|| MMOG|C51211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51211_01 - Conoco Phillips Petroleum Company Ltd|| MMOG|C51225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51225_01 - Daka Denmark A/S|| MMOG|C51252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51252_01 - Eni Norge|| MMOG|C51258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51258_01 - ESSO PETROLEUM COMPANY|| MMOG|C51260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51260_01 - ExxonMobil Business Support Center Hungary Ltd|| MMOG|C51261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51261_01 - ExxonMobil Malaysia SdnBhd|| MMOG|C51261_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51261_02 - ExxonMobil Petroleum & Chemical BVBA1802|| MMOG|C51284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51284_01 - Galp Energia, S. A.|| MMOG|C51376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51376_01 - Linjebygg Offshore AS|| MMOG|C51420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51420_01 - Neste Oil Oyj|| MMOG|C50234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50234_01 - Encana Corporation|| MMOG|C50247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50247_01 - ExxonMobil|| MMOG|C50247_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50247_02 - ExxonMobil|| MMOG|C50247_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50247_03 - ExxonMobil|| MMOG|C50268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50268_01 - FortisAlberta inc|| MMOG|C50268_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50268_02 - Fortis BC|| MMOG|C50277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50277_01 - Long Run|| MMOG|C50316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50316_01 - Husky|| MMOG|C50322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50322_01 - Imperial Oil Resources Limited|| MMOG|C50331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50331_01 - Inter Pipeline Fund|| MMOG|C50405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50405_01 - MEC Operating Company|| MMOG|C50427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50427_01 - Mosaic Energy Ltd|| MMOG|C50430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50430_01 - Murphy Oil Company Ltd|| MMOG|C50443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50443_01 - Nexen Inc.|| MMOG|C50479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50479_01 - Pengrowth Corporation|| MMOG|C50480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50480_01 - Penn West Petroleum Ltd|| MMOG|C50486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50486_01 - Suncor Energy Inc.|| MMOG|C50486_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50486_02 - Petro Canada|| MMOG|C50508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50508_01 - Taqa North Ltd|| MMOG|C50508_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50508_02 - TAQA House|| MMOG|C50508_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50508_03 - TAQA House|| MMOG|C50517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50517_01 - Provident Energy Ltd|| MMOG|C50578_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_03 - Shell|| MMOG|C50578_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_04 - Shell Oil|| MMOG|C50578_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_05 - Shell Oil|| MMOG|C50578_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_06 - Shell|| MMOG|C50578_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_07 - Shell Oil Company|| MMOG|C50578_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_08 - Shell Oil Company|| MMOG|C50578_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_09 - Shell Oil Company|| MMOG|C50620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50620_01 - Repsol Oil & Gas Canada Inc|| MMOG|C50647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50647_01 - Trident Exploration Corp.|| MMOG|C50696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50696_01 - XStrata Canada Corps. Affinerie CCR|| MMOG|C50708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50708_01 - Consortium DUC|| MMOG|C50708_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50708_02 - Consortium DUC|| MMOG|C50715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50715_01 - Total|| MMOG|C50715_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50715_02 - Total|| MMOG|C50726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50726_01 - PAS Development and Production Support|| MMOG|C50741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50741_01 - Weatherford Drilling Services|| MMOG|C50741_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50741_02 - Weatherford Drilling Services|| MMOG|C50790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50790_01 - Forent Energy Ltd|| MMOG|C50798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50798_01 - Dejour Energy Ltd|| MMOG|C50800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50800_01 - Pennwest Petroleum Ltd|| MMOG|C50808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50808_01 - Cognera Corp.|| MMOG|C50817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50817_01 - Sword Energy Inc.|| MMOG|C50818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50818_01 - Nabors Industries Ltd|| MMOG|C50820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50820_01 - Daylight Energy Trust|| MMOG|C50821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50821_01 - Fairbone Energy Trust|| MMOG|C50822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50822_01 - Mazeppa Processing Partnership|| MMOG|C50826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50826_01 - TriStar Oil and Gas Ltd.|| MMOG|C50827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50827_01 - W.F. Brown Exploration Ltd.|| MMOG|C50833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50833_01 - Delphi Energy Corporation|| MMOG|C50835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50835_01 - Marble Point Energy Ltd.|| MMOG|C50841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50841_01 - Pembina Pipeline Corporation|| MMOG|C50850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50850_01 - Crescent Point Energy Trust|| MMOG|C50852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50852_01 - Sydco Energy|| MMOG|C50853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50853_01 - Zapata Energy Corporation|| MMOG|C50854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50854_01 - Staghorn Energy LLC|| MMOG|C50857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50857_01 - Connaught Energy Ltd.|| MMOG|C50858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50858_01 - Ridgeback Exploration|| MMOG|C50860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50860_01 - TransCanada Pipelines Ltd|| MMOG|C50860_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50860_02 - TransCanada Pipelines Ltd|| MMOG|C50860_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50860_03 - TransCanada Pipelines Ltd|| MMOG|C50862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50862_01 - Artek Exploration Ltd|| MMOG|C50863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50863_01 - Bonavista Petroleum|| MMOG|C50864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50864_01 - Compass Petroleum|| MMOG|C50866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50866_01 - NuVista Energy Ltd|| MMOG|C50871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50871_01 - Venturion Natural Resources|| MMOG|C50874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50874_01 - BlackPearl Exploration and Production Ltd|| MMOG|C50881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50881_01 - Progress Energy Ltd|| MMOG|C50882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50882_01 - Chevron|| MMOG|C50882_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50882_02 - Chevron|| MMOG|C50883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50883_01 - Wood Group|| MMOG|C50885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50885_01 - Canada Capital Energy Corp.|| MMOG|C50886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50886_01 - CanEra Resources Inc.|| MMOG|C50887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50887_01 - Cequence Energy Ltd|| MMOG|C50888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50888_01 - Emergo Oil and Gas Inc.|| MMOG|C50889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50889_01 - Indian Oil and Gas Canada|| MMOG|C50890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50890_01 - Result Energy Inc.|| MMOG|C50895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50895_01 - Seven Generation Energy Ltd|| MMOG|C50898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50898_01 - Suncor Energy Inc.|| MMOG|C50900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50900_01 - Cenovus Energy Inc.|| MMOG|C50909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50909_01 - Bernum Petroleum Ltd.|| MMOG|C50912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50912_01 - Triangle Petroleum Corporation|| MMOG|C50917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50917_01 - Canadian Superior Energy Inc.|| MMOG|C50918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50918_01 - Legacy Oil and Gas Inc.|| MMOG|C50919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50919_01 - Prevail Energy Canada Ltd|| MMOG|C50920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50920_01 - RWE DEA AG|| MMOG|C50921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50921_01 - Range Resources|| MMOG|C50924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50924_01 - Storm Ventures International Inc.|| MMOG|C50927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50927_01 - Magellan Resources Ltd.|| MMOG|C50928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50928_01 - Triton Energy Corporation|| MMOG|C50930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50930_01 - Regent Resources Ltd|| MMOG|C50934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50934_01 - Bellamont Exploration Ltd|| MMOG|C50935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50935_01 - Bellatrix|| MMOG|C50936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50936_01 - Insignia Energy Ltd|| MMOG|C50937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50937_01 - Steen River Oil and Gas Ltd|| MMOG|C50939_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50939_01 - C50939_01 - 3 Martini Ventures|| MMOG|C50940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50940_01 - Enterra Energy Corp.|| MMOG|C50943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50943_01 - Molopo Energy Canada Ltd|| MMOG|C50944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50944_01 - Sun Century Petroleum|| MMOG|C50945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50945_01 - White North Energy|| MMOG|C50947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50947_01 - C50947_01 - Andes Petroleum Ecuador|| MMOG|C50948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50948_01 - Northpine Energy Ltd|| MMOG|C50952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50952_01 - Gibson Energy Ltd|| MMOG|C50956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50956_01 - ASRC Energy Services|| MMOG|C50959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50959_01 - Dundee Energy Limited Partnership|| MMOG|C50960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50960_01 - Northern Blizzard Resources Inc.|| MMOG|C50963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50963_01 - Surge Petroleum Inc.|| MMOG|C50964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50964_01 - Twin Butte Energy Ltd|| MMOG|C50965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50965_01 - Gear Energy Ltd|| MMOG|C50966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50966_01 - Omers Energy Services|| MMOG|C50967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50967_01 - E-T Energy Ltd|| MMOG|C50969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50969_01 - C50969_01 - Arcan Resources Ltd|| MMOG|C50970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50970_01 - Harvest Energy Trust|| MMOG|C50971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50971_01 - MC3 Resources Inc.|| MMOG|C50974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50974_01 - NAL Oil and Gas Trust|| MMOG|C50976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50976_01 - Anderson Energy Ltd|| MMOG|C50977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50977_01 - Jayhawk Resources Ltd|| MMOG|C50978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50978_01 - Peyto Exploration and Development Corporation|| MMOG|C50979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50979_01 - Spur Resources Ltd|| MMOG|C50980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50980_01 - GS E&R Canada|| MMOG|C50981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50981_01 - Titan West Resources Inc.|| MMOG|C50982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50982_01 - Touchstone Exploration Inc.|| MMOG|C50985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50985_01 - Avenir Operating Corporation|| MMOG|C50986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50986_01 - BJ Services Company Canada|| MMOG|C50987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50987_01 - Brownstone Resources Ltd|| MMOG|C50989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50989_01 - Highrock Energy Ltd|| MMOG|C50990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50990_01 - Keyera Energy|| MMOG|C50992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50992_01 - Ravenwood Energy Corp.|| MMOG|C50993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50993_01 - Sojourn Energy|| MMOG|C50995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50995_01 - Celtic Exploration Ltd|| MMOG|C50996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50996_01 - Novus Energy Inc.|| MMOG|C50997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50997_01 - Pace Oil and Gas Ltd|| MMOG|C50998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50998_01 - Spry Energy Ltd|| MMOG|C51002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51002_01 - InPlay Oil|| MMOG|C51003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51003_01 - Yangarra Resources Ltd|| MMOG|C51004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51004_01 - Palliser Oil and Gas Corporation|| MMOG|C51005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51005_01 - Stream Oil and Gas|| MMOG|C51008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51008_01 - Second Wave Petroleum Ltd|| MMOG|C51012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51012_01 - Conserve Oil Corporation|| MMOG|C51014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51014_01 - TECO Peoples Gas|| MMOG|C51017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51017_01 - Canadian Energy Exploration Inc.|| MMOG|C51018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51018_01 - Whitecap Resources Inc.|| MMOG|C51019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51019_01 - TORC Oil and Gas Ltd|| MMOG|C51020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51020_01 - Northern Patriot Oil and Gas Ltd|| MMOG|C51021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51021_01 - Freemont Resources|| MMOG|C51022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51022_01 - Fano Energy|| MMOG|C51023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51023_01 - Crew Energy Inc.|| MMOG|C51028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51028_01 - AvenEx Energy|| MMOG|C51030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51030_01 - Sonde Resources Corp.|| MMOG|C51031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51031_01 - Verity Energy Limited|| MMOG|C51037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51037_01 - Dolomite Energy Inc.|| MMOG|C51041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51041_01 - Glencoe Resources Ltd|| MMOG|C51042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51042_01 - Prairie Provident Resources Canada Ltd|| MMOG|C51043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51043_01 - TriCan|| MMOG|C51046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51046_01 - Enerflex Ltd.|| MMOG|C51048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51048_01 - Gefco|| MMOG|C51048_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51048_02 - Gefco|| MMOG|C51048_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51048_07 - Gefco|| MMOG|C51048_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51048_08 - Gefco|| MMOG|C51049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51049_01 - Canadian North|| MMOG|C51050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51050_01 - Enerplus Corporation|| MMOG|C51051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51051_01 - Pinecrest Energy Inc.|| MMOG|C51052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51052_01 - Adonai Resources Corp.|| MMOG|C51053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51053_01 - Fogo Energy Corp.|| MMOG|C51055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51055_01 - Niska Partners Management|| MMOG|C51059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51059_01 - PolarStar Canadian Oil and Gas Inc.|| MMOG|C51061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51061_01 - Tournament Exploration Ltd.|| MMOG|C51062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51062_01 - Veresen|| MMOG|C51063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51063_01 - BP Canada Ltd|| MMOG|C51064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51064_01 - NEP Canada|| MMOG|C51065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51065_01 - Perpetual Energy Inc.|| MMOG|C51069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51069_01 - Velvet Energy Ltd.|| MMOG|C51070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51070_01 - EOG Resources Canada Inc.|| MMOG|C51072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51072_01 - Petrus Resources Ltd.|| MMOG|C51073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51073_01 - Marquee Energy Ltd.|| MMOG|C51076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51076_01 - Pine Cliff Energy Ltd|| MMOG|C51078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51078_01 - Vesta Energy Ltd.|| MMOG|C51080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51080_01 - Ener T Corporation|| MMOG|C51081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51081_01 - Peyto Exploration and Development Corp.|| MMOG|C51082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51082_01 - Harvest Operations Corp.|| MMOG|C51085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51085_01 - Pemoco Ltd.|| MMOG|C51088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51088_01 - Baytex Energy Ltd.|| MMOG|C51089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51089_01 - Raffinage Marketing|| MMOG|C51089_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51089_02 - Raffinage Marketing|| MMOG|C51089_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51089_03 - Raffinage Marketing|| MMOG|C51090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51090_01 - LGX Oil & Gas Inc.|| MMOG|C51091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51091_01 - Ellisboro Energy Ltd.|| MMOG|C51092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51092_01 - Canadian Coyote (formely Montane Resources)|| MMOG|C51093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51093_01 - Athena Resources Ltd|| MMOG|C51095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51095_01 - Neo Exploration Inc.|| MMOG|C51096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51096_01 - Merit Energy Company, LLC|| MMOG|C51101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51101_01 - C51101_01 - Apache Canada Ltd.|| MMOG|C51102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51102_01 - Bearspaw Petroleum Ltd|| MMOG|C51106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51106_01 - United Hydrocarbon International Corp.|| MMOG|C51108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51108_01 - PetroBakken Energy Ltd.|| MMOG|C51109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51109_01 - Birchcliff Energy Ltd.|| MMOG|C51110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51110_01 - Sinopec Daylight Energy Ltd.|| MMOG|C51154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51154_01 - B.P.|| MMOG|C51162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51162_01 - Bayerngas Norge AS|| MMOG|C51167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51167_01 - BG INTERNATIONAL Ltd|| MMOG|C51168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51168_01 - BHP Billiton Olympic Dam Corporation P/L|| MMOG|C51172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51172_01 - BM ALLIANCE COAL OPERATIONS PTY LTD|| MMOG|C51574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51574_01 - SOCAR Energy Switzerland|| MMOG|C51587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51587_01 - Statoil|| MMOG|C51588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51588_01 - Statoil ASA|| MMOG|C51589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51589_01 - Statoil Fuel & Retail ASA|| MMOG|C51605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51605_01 - Svenska Shell|| MMOG|C51613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51613_01 - TAQA Bratani Limited|| MMOG|C51637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_01 - TOTAL|| MMOG|C51637_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_02 - TOTAL|| MMOG|C51637_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_03 - TOTAL|| MMOG|C51637_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_04 - TOTAL|| MMOG|C51637_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_05 - TOTAL|| MMOG|C51637_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_06 - TOTAL|| MMOG|C51637_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_09 - TOTAL|| MMOG|C51637_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_10 - TOTAL|| MMOG|C51637_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_11 - TOTAL|| MMOG|C51637_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_12 - TOTAL|| MMOG|C51637_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51637_13 - TOTAL|| MMOG|C51638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51638_01 - TOTAL UK Ltd|| MMOG|C51702_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51702_01 - Oil and Gas Other|| MMOG|C51707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51707_01 - Shell|| MMOG|C51713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51713_01 - CARDON IV, S.A.|| MMOG|C51715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51715_01 - Ecopetrol S.A.|| MMOG|C51723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51723_01 - REPSOL YPF VENEZUELA, S.A.|| MMOG|C51726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51726_01 - SOCIEDAD MINERA CERRO VERDE SAA|| MMOG|C51730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51730_01 - YPF S.A.|| MMOG|C51929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51929_01 - Atkins Danmark A/S|| MMOG|C52075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52075_01 - FWI Information Technology GmbH|| MMOG|C51466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_01 - OTHERS OIL & GAS|| MMOG|C51466_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_02 - OTHERS OIL & GAS|| MMOG|C51466_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_03 - OTHERS OIL & GAS|| MMOG|C51466_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_04 - OTHERS OIL & GAS|| MMOG|C51466_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_05 - OTHERS OIL & GAS|| MMOG|C51466_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_06 - OTHERS OIL & GAS|| MMOG|C51466_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_09 - OTHERS OIL & GAS|| MMOG|C51466_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_10 - OTHERS OIL & GAS|| MMOG|C51466_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_11 - OTHERS OIL & GAS|| MMOG|C51466_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51466_12 - OTHERS OIL & GAS|| MMOG|C51495_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51495_01 - PREEM|| MMOG|C51500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51500_01 - Puma Energy International B.V.|| MMOG|C51532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51532_01 - SAMIR|| MMOG|C51541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51541_01 - Sasol Wax GmbH|| MMOG|C51562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51562_01 - Shell|| MMOG|C51569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51569_01 - Skanska|| MMOG|C70260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70260_01 - BKK Kundetjenester AS|| MMOG|C52206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52206_01 - O.W. Bunker and Trading A/S|| MMOG|C52216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52216_01 - P/F Magn|| MMOG|C52336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52336_01 - SHELL REFINING AUSTRALIA LIMITED|| MMOG|C52340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52340_01 - MMG MANAGEMENT PTY LTD|| MMOG|C52341_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52341_02 - Southwest Gas Corporation|| MMOG|C52345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52345_01 - INPEX Corporation|| MMOG|C52347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C52347_01 - Questfire Energy Corp.|| MMOG|C59999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C59999_02 - Other Sub Sector MMOG|| MMOG|C60316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C60316_01 - Renegade Petroleum Ltd.|| MMOG|C60317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C60317_01 - Corex Resources Ltd. (formerly Magellan Resources)|| MMOG|C60324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C60324_01 - Progress Energy, Inc.|| MMOG|C70560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70560_01 - CONTUGAS S.A.C.|| MMOG|C70563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70563_01 - Empresa Nacional de Energia Enex S.A.|| MMOG|C70595_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70595_01 - Shell Canada Oil Sands|| MMOG|C70596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70596_01 - Menehune Resources Ltd.|| MMOG|C70597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70597_01 - Wyatt Oil & Gas Inc.|| MMOG|C70598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70598_01 - Cardinal Energy|| MMOG|C70608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70608_01 - Long Run Exploration Inc (formerly Guide/Westfire)|| MMOG|C70609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70609_01 - Predator Oil Ltd.|| MMOG|C70610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70610_01 - Tundra Oil & Gas Limited|| MMOG|C80105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80105_01 - OSI Energy Services|| MMOG|C80145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80145_01 - SkyWest Energy Corp|| MMOG|C80168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80168_01 - Northern Gas Networks Ltd|| MMOG|C80201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80201_01 - COMGAS|| MMOG|C80226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80226_01 - BlackShale Resources Inc.|| MMOG|C80227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80227_01 - Barnwell of Canada, Limited|| MMOG|C80228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80228_01 - Barrick Energy Inc|| MMOG|C80229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80229_01 - Ember Resources Inc|| MMOG|C80230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80230_01 - Santonia Energy Inc. (formerly Fairborne Energy)|| MMOG|C80231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80231_01 - Newton Energy Partners Canada|| MMOG|C80232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80232_01 - Journey Energy Inc. (formerly Sword Energy Inc.)|| MMOG|C80233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80233_01 - Spectra Energy Corp|| MMOG|C80234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80234_01 - C80234_01 - AltaGas Ltd.|| MMOG|C80235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80235_01 - SemCAMS ULC|| MMOG|C80236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80236_01 - Investors Petroleum Consultants Ltd.|| MMOG|C80237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80237_01 - Chevron Canada Resources|| MMOG|C70340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70340_01 - Esso Deutschland GmbH|| MMOG|C70350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70350_01 - GALP|| MMOG|C70409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70409_01 - MOX PRODUCTS PTY LTD|| MMOG|C70443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70443_01 - Outros O&G|| MMOG|C70452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70452_01 - Q8|| MMOG|C70457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70457_01 - Repsol|| MMOG|C70457_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70457_02 - Repsol S.A.|| MMOG|C70465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70465_01 - Savida|| MMOG|C70471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70471_01 - Shell|| MMOG|C81010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81010_01 - BG INTERNATIONAL|| MMOG|C81012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81012_01 - BP EXPLORATION COMPANY c/o ACCENTURE|| MMOG|C81013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81013_01 - BP INTERNATIONAL|| MMOG|C81014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81014_01 - BRITANIA OPERATOR|| MMOG|C81018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81018_01 - CONOCO PHILLIPS|| MMOG|C81019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81019_01 - ESSO PETROLEUM COMPANY|| MMOG|C81020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81020_01 - EUROSHELL CARDS BV|| MMOG|C81024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81024_01 - SHELL|| MMOG|C81026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81026_01 - TAQA Bratani|| MMOG|C81027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81027_01 - TOTAL E&P UK PLC|| MMOG|C81127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81127_01 - Paradigm Services Limited|| MMOG|C80279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80279_01 - Polskie Gornictwo Naftowe i Gazownictwo SA|| MMOG|C80282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80282_01 - Saguaro Resources Ltd.|| MMOG|C80288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80288_01 - EUROSHELL CARDS BV|| MMOG|C80335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80335_01 - Spyglass Resources Corp|| MMOG|C80338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80338_01 - Canera Energy Corp.|| MMOG|C80374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80374_01 - INTERNATIONAL POWER|| MMOG|C80383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80383_01 - NEDERLANDSE AARDOLIE MAATSCHAPPIJ BV|| MMOG|C80388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80388_01 - A/S NORSKE SHELL|| MMOG|C80397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80397_01 - Teck Resources Limited|| MMOG|C80407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80407_01 - Nytis Exploration Company|| MMOG|C80458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80458_01 - Database Services|| MMOG|C80460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80460_01 - Northpoint Energy Ltd|| MMOG|C80668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80668_01 - Lightstream Resources Ltd.|| MMOG|C80679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80679_01 - Camino Industries Inc|| MMOG|C80687_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80687_01 - Dominion Diamond Ekati Corporation|| MMOG|C80732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80732_01 - West Valley Energy Corp.|| MMOG|C80743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80743_01 - B.C. Oil and Gas Commission|| MMOG|C80824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80824_01 - Norwest Corporation|| MMOG|C81165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81165_01 - Canadian Association of Petroleum Producers|| MMOG|C81173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81173_01 - Fuego Resources Ltd.|| MMOG|C81174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81174_01 - Teine Energy (Formerly Marble Point)|| MMOG|C81207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81207_01 - TRAFIGURA GLOBAL SERVICES PRIVATE LIMITED|| MMOG|C81232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81232_01 - Shell International Petroleum|| MMOG|C81233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81233_01 - Shell Business Service Centre Sdn Bhd|| MMOG|C81234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81234_01 - Shell Company of Australia Ltd|| MMOG|C81242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81242_01 - Shell International Petroleum|| MMOG|C81243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81243_01 - Shell Business Service Centre Sdn Bhd|| MMOG|C81248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81248_01 - RockEast Energy Corp.|| MMOG|C81274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81274_01 - DanishUndergroundConsortium|| MMOG|C81280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81280_01 - ZargonOil&GasLtd.|| MMOG|C81294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81294_01 - BeringerEnergyInc|| MMOG|C81297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81297_01 - VenturionOilLimited|| MMOG|C81306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81306_01 - OnionLakeEnergyLtd.|| MMOG|C81330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81330_01 - Grizzly Resources Ltd|| MMOG|C81341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81341_01 - Savana Energy Services Corp.|| MMOG|C81342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81342_01 - CAN/AB - Alberta Energy Regulator|| MMOG|C81350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81350_01 - Longview Oil Corp.|| MMOG|C81351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81351_01 - Kicking Horse Energy Inc|| MMOG|C81449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81449_01 - Revel Resources Inc.|| MMOG|C81450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81450_01 - Ptarmigan Oil & Gas Accounting Ltd.|| MMOG|C81457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81457_01 - Code Montreal|| MMOG|C10677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C10677_01 - Sunoco Logistics|| MMOG|C10782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C10782_01 - Energy Accounting Services Inc.|| MMOG|C51243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51243_01 - E&P Information Management Association (EPIM)|| MMOG|C81498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81498_01 - Dewpoint Resources Ltd.|| MMOG|C81505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81505_01 - Halo Exploration Ltd.|| MMOG|C81511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81511_01 - Centrica Energy Canada|| MMOG|C81527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81527_01 - Premier Natural Resources, LLC|| MMOG|C81528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81528_01 - C81528_01 - 908183 Alberta Ltd.|| MMOG|C81541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81541_01 - Accord Energy Solutions Limited|| MMOG|C81542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81542_01 - AMOCO UK EXPLORATION COMPANY|| MMOG|C51710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51710_01 - Anglo American Chile Ltda|| MMOG|C51711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51711_01 - Anglo American Norte S.A.|| MMOG|C51795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51795_01 - Outokumpu|| MMOG|C51870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51870_01 - PREEM|| MMOG|C22087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C22087_01 - MASPRO|| MMOG|C40383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C40383_01 - Procesos y Diseños Energéticos S.A.|| MMOG|C50124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50124_01 - Calgary Laboratory Services|| MMOG|C50411_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50411_02 - Meridian Credit Union|| MMOG|C50651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50651_01 - Triton|| MMOG|C50771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50771_01 - Georesources Inc.|| MMOG|C50782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50782_01 - McCoy Petroleum - Windows|| MMOG|C50796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50796_01 - Upper Lake Oil and Gas Ltd|| MMOG|C50799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50799_01 - Goodland Energy Ltd|| MMOG|C50802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50802_01 - Nordegg Resources|| MMOG|C50803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50803_01 - Pradera Resources|| MMOG|C50813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50813_01 - Kroes Energy|| MMOG|C50815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50815_01 - Quicksilver Resources Canada Inc.|| MMOG|C50816_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50816_01 - Scollard Energy Inc.|| MMOG|C50819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50819_01 - Corinthian Energy|| MMOG|C50823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50823_01 - Medora Resources Inc.|| MMOG|C50824_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50824_01 - Paramount Resources Ltd|| MMOG|C50825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50825_01 - Stone Mountion Resource Ltd.|| MMOG|C50829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50829_01 - Pearl Exploration and Production Ltd|| MMOG|C50834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50834_01 - Rondo Petroleum Inc.|| MMOG|C50845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50845_01 - 956778 Alberta Ltd|| MMOG|C50846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50846_01 - Villanova Resources Inc.|| MMOG|C50849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50849_01 - Althen Drilling Ltd.|| MMOG|C50851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50851_01 - Stetson Oil and Gas Ltd|| MMOG|C50856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50856_01 - Bronco Energy|| MMOG|C50859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50859_01 - Rock Energy Inc.|| MMOG|C50865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50865_01 - Emerald Bay Energy Inc.|| MMOG|C50867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50867_01 - Quatro Resources Inc.|| MMOG|C50868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50868_01 - Shelter Bay Energy Inc.|| MMOG|C50869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50869_01 - Total E and P Canada Ltd|| MMOG|C50870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50870_01 - UFA|| MMOG|C50872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50872_01 - Dart Energy|| MMOG|C50873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50873_01 - Seneca Resources Corporation|| MMOG|C50891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50891_01 - Tourmaline Oil Corporation|| MMOG|C50894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50894_01 - Marbob Energy Corporation|| MMOG|C50901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50901_01 - Coast Resources|| MMOG|C50902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50902_01 - Hunt Oil Company of Canada|| MMOG|C50903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50903_01 - Tuscany Energy Limited|| MMOG|C50904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50904_01 - JRB Oil and Gas Services|| MMOG|C50905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50905_01 - Linn Energy|| MMOG|C50905_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50905_02 - Linn Energy|| MMOG|C50908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50908_01 - Flint Energy Services Ltd|| MMOG|C50923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50923_01 - Sifton Energy Inc.|| MMOG|C50933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50933_01 - Nabors Canada|| MMOG|C50938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50938_01 - Southwestern Energy|| MMOG|C50949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50949_01 - Sage Energy|| MMOG|C50953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50953_01 - Parallel Petroleum|| MMOG|C50954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50954_01 - Golden Pass LNG|| MMOG|C50968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50968_01 - Milestone Exploration Inc.|| MMOG|C50972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50972_01 - ENI Petroleum|| MMOG|C50973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50973_01 - Wagner Oil Company|| MMOG|C50975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50975_01 - Enform|| MMOG|C50983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50983_01 - Trans Energy Inc.|| MMOG|C50988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50988_01 - Calver Resources Inc.|| MMOG|C50991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50991_01 - Longford Corp.|| MMOG|C50994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50994_01 - ARES Energy|| MMOG|C51011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51011_01 - Davis Petroleum Corporation|| MMOG|C51015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51015_01 - Chesapeake Energy Company|| MMOG|C51016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51016_01 - Siemens Canada|| MMOG|C51016_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51016_02 - Siemens Canada|| MMOG|C51029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51029_01 - Connacher Oil and Gas Limited|| MMOG|C51033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51033_01 - Gefco|| MMOG|C51033_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51033_02 - Gefco|| MMOG|C51038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51038_01 - Plains Midstream Canada|| MMOG|C51039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51039_01 - Vermilion Energy Trust|| MMOG|C51054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51054_01 - P1 Energy Corporation|| MMOG|C51056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51056_01 - Solaris Management Consultants Inc.|| MMOG|C51071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51071_01 - Apache Egypt Companies|| MMOG|C51075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51075_01 - OSUM Oil Sands Corp.|| MMOG|C51084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51084_01 - Southern Pacific Resources Corp|| MMOG|C51086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51086_01 - Chinook Energy (Amalgamated Iteration & Storm)|| MMOG|C51097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51097_01 - Parsley Energy Operations, LLC|| MMOG|C51098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51098_01 - ExL Petroleum, LP|| MMOG|C51099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51099_01 - Cambrian Management, Ltd.|| MMOG|C51100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51100_01 - Staley Operating Co.|| MMOG|C51103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51103_01 - Naumann Oil & Gas Inc|| MMOG|C51105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51105_01 - Wolf Energy|| MMOG|C51107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51107_01 - Rife Resources Ltd.|| MMOG|C10524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C10524_01 - Kroes Energy Inc.|| MMOG|C10732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C10732_01 - Sagess|| MMOG|C51876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51876_01 - Statoil|| MMOG|C51879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51879_01 - Svenska Shell|| MMOG|C51901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51901_01 - Skanska|| MMOG|C60203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C60203_01 - SAN IGNACIO S.A.|| MMOG|C70339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70339_01 - Esso|| MMOG|C70358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70358_01 - Hafslund|| MMOG|C70593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70593_01 - Exploration & Production Canada EPW|| MMOG|C70602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70602_01 - BP p.l.c.|| MMOG|C70603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70603_01 - Schlumberger Limited|| MMOG|C70604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70604_01 - Whiting Petroleum Corporation|| MMOG|C70605_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70605_01 - Merrick Systems, Inc.|| MMOG|C70611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C70611_01 - DaMar Resources, Inc.|| MMOG|C80372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80372_01 - BP EXPLORATION COMPANY c/o ACCENTURE|| MMOG|C80435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80435_01 - RPS|| MMOG|C80435_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80435_02 - RPS|| MMOG|C80435_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80435_03 - RPS|| MMOG|C80637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80637_01 - Shell|| MMOG|C80685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80685_01 - DFG Energy Company, LLC|| MMOG|C80772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80772_01 - Ergon Exploration, Inc.|| MMOG|C80823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80823_01 - West Valley Energy Inc.|| MMOG|C80825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80825_01 - Oil and Gas Commission|| MMOG|C80940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C80940_01 - EUROSHELL CARDS BV|| MMOG|C81022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81022_01 - NEDERLANDSE AARDOLIE MAATSCHAPPIJ BV|| MMOG|C81230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81230_01 - SHELL STASCO UK-103390|| MMOG|C81334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81334_01 - AWP Operating Company|| MMOG|C81340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81340_01 - Apex Energy, LLC (PA)|| MMOG|C81389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81389_01 - Fair Oil Ltd|| MMOG|C10256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C10256_01 - Jacques Whitford|| MMOG|C11081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C11081_01 - Raven Resources, LLC|| MMOG|C10999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C10999_01 - C10999_01 - Caltex Ressources|| MMOG|C51585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51585_01 - St1 Oy|| MMOG|C51437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C51437_01 - OK-Q8|| MMOG|C81568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81568_01 - Questerre Energy Corporation|| MMOG|C81548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81548_01 - Crocotta Energy Inc.|| MMOG|C81561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81561_01 - Kaisen Energy Corp|| MMOG|C81569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81569_01 - Questerre Energy Corporation|| MMOG|C81589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81589_01 - Modern Resources Inc.|| MMOG|C81594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81594_01 - Canadian International Oil Operating Corp.|| MMOG|C81604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81604_01 - Ikkuma Resources|| MMOG|C81618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81618_01 - Savanna Energy Services Corp.|| MMOG|C81696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81696_01 - BP Corporation of North America|| MMOG|C81730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81730_01 - Viva Energy Australia Ltd|| MMOG|C81731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81731_01 - VIVA ENERGY REFINING PTY LTD|| MMOG|C81743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81743_01 - MFC Resource Partnership|| MMOG|C81744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81744_01 - Leucrotta Exploration Inc.|| MMOG|C81745_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81745_01 - Imaginea Energy Corp.|| MMOG|C81746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81746_01 - Jupiter Resources Inc.|| MMOG|C81749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81749_01 - Kelt Exploration Ltd|| MMOG|C81775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81775_01 - Fabricom AS|| MMOG|C50578_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50578_10 - Shell Nederland B.V.|| MMOG|C81873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81873_01 - Ikkuma Resources Corp. (formerly PanTerra)|| MMOG|C81874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81874_01 - Chugach Electric Association, Inc.|| MMOG|C81890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81890_01 - WARRIOR ENERGY CORPORATION|| MMOG|C81896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81896_01 - Schlumberger|| MMOG|C81906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81906_01 - Prosper Petroleum Ltd.|| MMOG|C81908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81908_01 - Petrotranz Inc.|| MMOG|C81874_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81874_02 - Chugach Electric Association, Inc.|| MMOG|C50725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C50725_01 - Oil and Gas Maintenance|| MMOG|C81925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81925_01 - BHPBilliton|| MMOG|C81930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81930_01 - PrairieSky Royalty Ltd.|| MMOG|C81941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81941_01 - HXC Corporation|| MMOG|C82005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82005_01 - BHP BILLITON GROUP OPERATIONS PTY LTD|| MMOG|C82130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82130_01 - ST1 Finland|| MMOG|C82152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82152_01 - GOLDEN PASS LNG TERMINAL LLC|| MMOG|C82163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82163_01 - Piedmont Natural Gas Company, Inc.|| MMOG|C82182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82182_01 - Liberty Utilities|| MMOG|C82185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82185_01 - ST1|| MMOG|C82186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82186_01 - Petron Fuel International|| MMOG|C82266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82266_01 - CST Canada Co.|| MMOG|C82269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82269_01 - St1 Sverige AB|| MMOG|C82272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82272_01 - ST1 OY|| MMOG|C82365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82365_01 - CALTEX AUSTRALIA PETROLEUM PTY LTD|| MMOG|C82418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82418_01 - NEXEN ENERGY SERVICES, U.S.A. Inc.|| MMOG|C82431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82431_01 - Paradigm Services Limited|| MMOG|C82446_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82446_01 - Tundra Technical Solutions Inc|| MMOG|C82460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82460_01 - ST1 OY|| MMOG|C82464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82464_01 - St1 Sverige AB|| MMOG|C82473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82473_01 - Heritage Resource Limited Partnership|| MMOG|C82485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82485_01 - Exxon Asia|| MMOG|C82488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82488_01 - Consumers' Co-operative Refineries Ltd|| MMOG|C82532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82532_01 - DONG|| MMOG|C82534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82534_01 - ASCENT RESOURCES OPERATING, LLC|| MMOG|C82536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82536_01 - Shell Int Exploration and Production B.V|| MMOG|C82537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82537_01 - Shell Int Exploration and Production B.V|| MMOG|C82571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82571_01 - CHEVRON ENERGY TECHNOLOGY COMPANY|| MMOG|C82642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82642_01 - Shell International Petroleum Company|| MMOG|C82712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82712_01 - Sunoco Logistics|| MMOG|C82757_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82757_01 - GeoComputing Group LLC|| MMOG|C82787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82787_01 - �nergie Valero Inc|| MMOG|C82894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82894_01 - SHELLINTERNATIONAL|| MMOG|C82900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82900_01 - ENV-COM-CHEVRONPHILLIPS|| MMOG|C82926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82926_01 - Shell Downstream Services International|| MMOG|C82959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C82959_01 - DMS-Mansfield (DMS)|| MMOG|C10703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10703_01 - Newalta|| MMOG|C83098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83098_01 - MOL Group|| MMOG|C83136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83136_01 - PBF Energy|| MMOG|C83457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83457_01 - Sunoco Logistics Partners L.P.|| MMOG|C83578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83578_01 - Total Oil|| MMOG|C83599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83599_01 - Alberta Energy Regulator|| MMOG|C83643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83643_01 - Liberty Utilities|| MMOG|C83685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83685_01 - NET4GAS, s.r.o.|| MMOG|C83713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83713_01 - ACOMA OIL CORP|| MMOG|C83719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83719_01 - ALTA MESA HOLDINGS,LLC|| MMOG|C83729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83729_01 - ANADARKO PETROLEUM|| MMOG|C83733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83733_01 - Apache Corporation|| MMOG|C83740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83740_01 - ARKOMA PRODUCTION COMPANY OF TEXAS, INC|| MMOG|C83742_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83742_01 - ASCENT RESOURCES OPERATING, LLC|| MMOG|C83745_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83745_01 - ATLANTIC OIL COMPANY|| MMOG|C83746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83746_01 - AWP OPERATING|| MMOG|C83747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83747_01 - BAIRD OIL|| MMOG|C83754_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83754_01 - BANE BIGBIE|| MMOG|C83762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83762_01 - BASS ENTERPRISES|| MMOG|C83765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83765_01 - BECKER OIL COMPANY|| MMOG|C83770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83770_01 - BLACK HILLS EXPLORATION & PRODUCTION|| MMOG|C83773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83773_01 - BLUE STAR OPERATING COMPANY|| MMOG|C83776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83776_01 - BP Corporation NA Inc|| MMOG|C83777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83777_01 - BRECK OPERATING COMPANY|| MMOG|C83780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83780_01 - BRYAN WOODBINE|| MMOG|C83785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83785_01 - CAMTERRA RESOURCES|| MMOG|C83791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83791_01 - CDX GAS, LLC|| MMOG|C83798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83798_01 - Chesapeake|| MMOG|C83799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83799_01 - CHEVRON ENERGY TECHNOLOGY COMPANY|| MMOG|C83802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83802_01 - CHEYENNE PETROLEUM CORPORATION|| MMOG|C83805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83805_01 - CITATION OIL & GAS|| MMOG|C83836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83836_01 - CYPRESS E&P CORP.-WINDOWS|| MMOG|C83838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83838_01 - DALE OPERATING|| MMOG|C83839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83839_01 - Dallas Oil & Gas|| MMOG|C83840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83840_01 - DAMAR RESOURCES|| MMOG|C83843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83843_01 - DAVIS PETROLEUM|| MMOG|C83847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83847_01 - Delaware Basin Midstream,LLC|| MMOG|C83853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83853_01 - DREILING OIL, INC.|| MMOG|C83854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83854_01 - DUGAN PRODUCTION COMPANY|| MMOG|C83856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83856_01 - DYNAMIC PRODUCTION, INC.|| MMOG|C83857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83857_01 - ECHO PRODUCTION, INC.|| MMOG|C83867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83867_01 - Enervest, Ltd.|| MMOG|C83868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83868_01 - ENI PETROLEUM|| MMOG|C83873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83873_01 - ETOCO, INC.|| MMOG|C83874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83874_01 - EXCO RESOURCES|| MMOG|C83876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83876_01 - EXL Petroleum Operating Inc.|| MMOG|C83878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83878_01 - FAIR OIL, LTD|| MMOG|C83892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83892_01 - Gasper Rice Resources, Ltd.|| MMOG|C83894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83894_01 - GENERAL OIL COMPANY|| MMOG|C83895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83895_01 - GeoComputing Group LLC|| MMOG|C83902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83902_01 - GREYSTONE OIL & GAS DRIL|| MMOG|C83906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83906_01 - HALLIBURTON|| MMOG|C83910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83910_01 - HARTMAN OIL COMPANY WINDOWS|| MMOG|C83914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83914_01 - HEARTLAND OIL & GAS|| MMOG|C83927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83927_01 - Interstate Natural Gas Co.|| MMOG|C83929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83929_01 - JAS Palo Partners I, LP|| MMOG|C83930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83930_01 - JAS Palo Partners II,LP|| MMOG|C83934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83934_01 - JRB OIL & GAS COMPANY|| MMOG|C83935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83935_01 - Kaiser-Francis Oil Company|| MMOG|C83948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83948_01 - LIBERTY OPERATIONS & COMPLET.|| MMOG|C83949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83949_01 - LION OIL COMPANY|| MMOG|C83960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83960_01 - MAP ROYALTY, INC.|| MMOG|C83961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83961_01 - MARBOB ENERGY CORPORATION|| MMOG|C83966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83966_01 - M-B OPERATING|| MMOG|C83968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83968_01 - MCCOY PETROLEUM-WINDOWS|| MMOG|C83969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83969_01 - MDU Resources|| MMOG|C83974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83974_01 - MEWBOURNE|| MMOG|C83982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83982_01 - Motiva Enterprises|| MMOG|C83984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83984_01 - MS KLOTZMAN|| MMOG|C83985_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83985_01 - MSE CAPITAL CORPORATION|| MMOG|C83986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83986_01 - Mulloy Operating, Inc|| MMOG|C83987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83987_01 - MURPHY OIL CORPORATION|| MMOG|C83992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C83992_01 - Nauman Oil and Gas|| MMOG|C84001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84001_01 - NEWFIELD PRODUCTION COMPANY|| MMOG|C84003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84003_01 - NEXEN ENERGY SERVICES, U.S.A. Inc.|| MMOG|C84009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84009_01 - NRG Asset Management, LLC|| MMOG|C84022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84022_01 - Palo Cowtown Royalty Partners II, LP|| MMOG|C84024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84024_01 - Palo Strategic Partners, LLC|| MMOG|C84025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84025_01 - Palo-Argenta Partners-A, LLC|| MMOG|C84026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84026_01 - Palo-Cowtown Royalty Partners , LP|| MMOG|C84027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84027_01 - Palo-Perryman Royalty Fund I, LP|| MMOG|C84032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84032_01 - Permian Resources, LLC|| MMOG|C84033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84033_01 - PETROLEUM TECHNOLOGIES-WINDOWS|| MMOG|C84034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84034_01 - PetroSource, LLC|| MMOG|C84036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84036_01 - PIONEER EXPLORATION, LTD|| MMOG|C84037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84037_01 - Pioneer Natural Resources USA, Inc.|| MMOG|C84040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84040_01 - Premier Natural Resources,LLC|| MMOG|C84045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84045_01 - QUINTIN LITTLE CO.|| MMOG|C84047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84047_01 - R. LACY, INC.|| MMOG|C84048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84048_01 - R.P. Nixon|| MMOG|C84050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84050_01 - RANOLA OIL COMPANY|| MMOG|C84052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84052_01 - REEF EXPLORATION, INC.|| MMOG|C84056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84056_01 - RIO PETROLEUM|| MMOG|C84060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84060_01 - ROOSTH PROD|| MMOG|C84067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84067_01 - SANCHEZ OIL & GAS CORPORATION|| MMOG|C84070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84070_01 - SAVOY OIL & GAS, INC.|| MMOG|C84071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84071_01 - SCHLUMBERGER TECHNOLOGY CORP.|| MMOG|C84074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84074_01 - SENECA RESOURCES|| MMOG|C84075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84075_01 - SINCLAIR OIL|| MMOG|C84083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84083_01 - SOUTHERN UNION GAS SERVICES|| MMOG|C84091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84091_01 - Staley Operating|| MMOG|C84100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84100_01 - STRATA PRODUCTION|| MMOG|C84106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84106_01 - T.S. Dudley Land Company, Inc.|| MMOG|C84107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84107_01 - TALON DEVELOPMENT COMPANY|| MMOG|C84110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84110_01 - TAUBER OIL|| MMOG|C84114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84114_01 - TEEPEE PETROLEUM CO.|| MMOG|C84115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84115_01 - TEMA OIL AND GAS COMPANY|| MMOG|C84116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84116_01 - TERRY PETROLEUM COMPANY|| MMOG|C84118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84118_01 - TEXAS AMERICAN RESOURCES CO.|| MMOG|C84121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84121_01 - TEXLAND PETROLEUM, INC|| MMOG|C84124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84124_01 - THORP PETROLEUM CORPORATION|| MMOG|C84125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84125_01 - TOTAL E AND P USA, INC.|| MMOG|C84128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84128_01 - Travis Property Management, LLC|| MMOG|C84129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84129_01 - Trek AEC, LLC|| MMOG|C84145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84145_01 - VALENCE OPERATING|| MMOG|C84154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84154_01 - WAGNER OIL COMPANY|| MMOG|C84156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84156_01 - WALSH PETROLEUM, INC.|| MMOG|C84157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84157_01 - WARD PETROLEUM CORPORATION|| MMOG|C84160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84160_01 - WESTERN NATURAL GAS|| MMOG|C84168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84168_01 - WOOD GROUP ENGINEERING (North Sea)|| MMOG|C84170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84170_01 - WVO|| MMOG|C84175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C84175_01 - Heritage Gas Limited|| MRD|Retail_and_Consumer_Services|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Retail and Consumer Services|| Retail_and_Consumer_Services|RRET|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| RRET|C11150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C11150_01 - Prestatyn UK_Commercial_Non_PSA|| RRET|C11162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C11162_01 - Somerfield|| RRET|C51193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51193_01 - Carrefour|| RRET|C51194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_01 - CARREFOUR|| RRET|C51194_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_02 - CARREFOUR|| RRET|C51194_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_03 - CARREFOUR|| RRET|C51194_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_04 - CARREFOUR|| RRET|C51194_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_05 - CARREFOUR|| RRET|C51194_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_06 - CARREFOUR|| RRET|C51194_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_07 - Carrefour|| RRET|C51194_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_09 - CARREFOUR|| RRET|C51194_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_11 - CARREFOUR|| RRET|C51194_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_12 - CARREFOUR|| RRET|C51195_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_02 - CASINO|| RRET|C51195_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_03 - CASINO|| RRET|C51195_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_04 - CASINO|| RRET|C51195_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_05 - CASINO|| RRET|C51195_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_06 - CASINO|| RRET|C51195_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_07 - CASINO|| RRET|C51195_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_11 - CASINO|| RRET|C51249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51249_01 - Ellos|| RRET|C51259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51259_01 - Esthetique Norge AS|| RRET|C51276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51276_01 - FRANQUIGEST|| RRET|C51298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51298_01 - H&M|| RRET|C51305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51305_01 - HP|| RRET|C51314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51314_01 - ICA|| RRET|C51321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51321_01 - INBEV|| RRET|C51348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51348_01 - Kesko Oyj|| RRET|C51349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51349_01 - KF|| RRET|C51354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51354_01 - Kjedehuset AS|| RRET|C51372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51372_01 - LIDL|| RRET|C51374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51374_01 - Lindex|| RRET|C51382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51382_01 - LVMH|| RRET|C51382_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51382_04 - LVMH|| RRET|C51382_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51382_05 - LVMH|| RRET|C51382_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51382_09 - LVMH|| RRET|C51388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51388_01 - Marcus Gruppen A/S|| RRET|C51389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51389_01 - Maskun Kalustetalo Oy|| RRET|C51392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51392_01 - Mekonomen|| RRET|C51405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51405_01 - Moelven|| RRET|C51413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51413_01 - MYER PTY LTD (Vendor No 7002681)|| RRET|C51423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51423_01 - Netcentric|| RRET|C50364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C50364_01 - Le Groupe Master|| RRET|C51143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_01 - AUCHAN|| RRET|C51143_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_02 - AUCHAN|| RRET|C51143_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_03 - AUCHAN|| RRET|C51143_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_04 - AUCHAN|| RRET|C51143_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_05 - AUCHAN|| RRET|C51143_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_06 - AUCHAN|| RRET|C51143_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_07 - AUCHAN|| RRET|C51143_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_09 - AUCHAN|| RRET|C51146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51146_01 - Auto Expo|| RRET|C51152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51152_01 - Axfood|| RRET|C51580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51580_01 - SONAE|| RRET|C51597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51597_01 - Suomen Osuuskauppojen Keskuskunta|| RRET|C51610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51610_01 - Systembolaget|| RRET|C51632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51632_01 - Tiimari Oyj Abp|| RRET|C51688_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51688_01 - AHOLD|| RRET|C51906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51906_01 - 2 Big Company A/S|| RRET|C51914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51914_01 - Aarstiderne A/S|| RRET|C51917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51917_01 - Active Sportswear International A/S|| RRET|C51940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51940_01 - BG Concept|| RRET|C51942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51942_01 - Bianco Footwear A/S|| RRET|C51943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51943_01 - Bianco Footwear Sweden AB|| RRET|C51947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51947_01 - Birger Christensen A/S|| RRET|C51948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51948_01 - Birk Studieboghandel|| RRET|C51949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51949_01 - Bisgaard Sko Aps|| RRET|C51950_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51950_01 - Black Swan Fashion A/S|| RRET|C51954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51954_01 - Bloomingville A/S|| RRET|C51957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51957_01 - Bon' A Parte A/S|| RRET|C51960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51960_01 - Brands of Scandinavia A/S|| RRET|C51968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51968_01 - BuildIT SA|| RRET|C51977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51977_01 - CAMUS A/S|| RRET|C51981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51981_01 - Carl Ras A/S|| RRET|C51982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51982_01 - C'arla Du Nord A/S|| RRET|C51984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51984_01 - Carrington Aps|| RRET|C51991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51991_01 - Change of Scandinavia A/S|| RRET|C51992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51992_01 - Charlotte Sparre A/S|| RRET|C51994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51994_01 - Claire Retail A/S|| RRET|C51998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51998_01 - Container Aps|| RRET|C51999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51999_01 - Contrast ApS|| RRET|C52000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52000_01 - Converse Scandinavia|| RRET|C52024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52024_01 - Day Birger and Mikkelsen|| RRET|C52034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52034_01 - Dress Partner a.m.b.a.|| RRET|C52036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52036_01 - Dyrberg and Kern A/S|| RRET|C52041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52041_01 - Ecco Sko A/S|| RRET|C52058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52058_01 - Erhvervsskolernes Forlag|| RRET|C52062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52062_01 - Expedit A/S|| RRET|C52067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52067_01 - Flexa4Dreams A/S|| RRET|C52092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52092_01 - Group 88 A/S|| RRET|C52096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52096_01 - Hatting K/S|| RRET|C52097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52097_01 - Heart Made A/S|| RRET|C52110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52110_01 - Hummel International Sport and Leisure A/S|| RRET|C52116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52116_01 - Imerco A/S|| RRET|C51455_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51455_07 - OTHERS - CONVENIENCE GOODS|| RRET|C51455_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51455_11 - OTHERS - CONVENIENCE GOODS|| RRET|C51455_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51455_12 - OTHERS - CONVENIENCE GOODS|| RRET|C51460_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_02 - OTHERS - RETAIL|| RRET|C51460_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_03 - OTHERS - RETAIL|| RRET|C51460_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_04 - OTHERS - RETAIL|| RRET|C51460_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_05 - OTHERS - RETAIL|| RRET|C51460_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_06 - OTHERS - RETAIL|| RRET|C51460_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_07 - OTHERS - RETAIL|| RRET|C51460_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_09 - OTHERS - RETAIL|| RRET|C51460_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_11 - OTHERS - RETAIL|| RRET|C51460_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_12 - OTHERS - RETAIL|| RRET|C51469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51469_01 - Otto (GmbH & Co.KG)|| RRET|C51512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51512_01 - Reitan Gruppen|| RRET|C51517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51517_01 - Retail/CPG|| RRET|C51520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51520_01 - Riis Retail A/S|| RRET|C51567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51567_01 - SIVA|| RRET|C52132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52132_01 - Jepsen Biler Aps|| RRET|C52134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52134_01 - JP Group, Viborg A/S|| RRET|C52136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52136_01 - Junk de Luxe A/S|| RRET|C52138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52138_01 - KABOOKI A/S|| RRET|C52147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52147_01 - L. V. Erichsen A/S|| RRET|C52152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52152_01 - LazyLazy.com|| RRET|C52172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52172_01 - Mads Nørgaard - Copenhagen A/S|| RRET|C52177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52177_01 - Margarinefabrikken Grønvang|| RRET|C52183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52183_01 - Midtsjællands Autocentrum|| RRET|C52187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52187_01 - Missya A/S|| RRET|C52188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52188_01 - Moby dick Postordre|| RRET|C52212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52212_01 - Østjydsk Våbenhandel A/S|| RRET|C52215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52215_01 - P. Sinnerup and Co. ApS|| RRET|C52221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52221_01 - Persikan i Uddevalla AB|| RRET|C52229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52229_01 - Pom Pom|| RRET|C52234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52234_01 - Rabens Saloner|| RRET|C52242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52242_01 - ReMinditems|| RRET|C52246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52246_01 - Ronald A/S|| RRET|C52272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52272_01 - Semler Services A/S|| RRET|C52274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52274_01 - Siba Danmark, (Computercity)|| RRET|C52276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52276_01 - Skobox|| RRET|C52277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52277_01 - Skoringen ApS|| RRET|C52279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52279_01 - Sofie Schnoor A/S|| RRET|C52281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52281_01 - Solo Clothing Company A/S|| RRET|C52283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52283_01 - Søren Nielsen , Flade Aps|| RRET|C52286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52286_01 - Spejder Sport A/S|| RRET|C52306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52306_01 - Tryde Andrés|| RRET|C52313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52313_01 - UTG|| RRET|C52317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52317_01 - Valdata Consulting GmbH|| RRET|C52321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52321_01 - Vernon Sport ApS|| RRET|C52331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C52331_01 - Witre AB|| RRET|C60002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60002_01 - The Mobile Shop|| RRET|C60015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60015_01 - Canadian Tire|| RRET|C60015_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60015_02 - Canadian Tire|| RRET|C60015_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60015_03 - Canadian Tire Corporation, Limited|| RRET|C60024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60024_01 - Comark Ltd|| RRET|C60024_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60024_02 - Comark Ltd|| RRET|C60024_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60024_03 - Comark Ltd|| RRET|C60032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60032_01 - Grand and Toy Limited|| RRET|C60032_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60032_02 - Grand and Toy Limited|| RRET|C60032_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60032_03 - Grand and Toy Limited|| RRET|C60037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60037_01 - La vie en rose|| RRET|C60048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60048_01 - Mark's Work Wearhouse Ltd|| RRET|C60051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60051_01 - Métro Richelieu|| RRET|C60051_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60051_02 - Metro Richelieu|| RRET|C60051_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60051_03 - Metro Richelieu|| RRET|C60051_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60051_04 - Métro Richelieu|| RRET|C60062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60062_01 - Rona Inc.|| RRET|C60062_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60062_02 - Rona Inc.|| RRET|C60066_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60066_02 - Sterling Jewelers|| RRET|C60066_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60066_03 - Sterling Jewelers|| RRET|C60066_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60066_04 - Sterling Jewelers|| RRET|C60066_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60066_05 - Sterling Jewelers|| RRET|C60067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60067_01 - Stokes|| RRET|C60067_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60067_03 - Stokes|| RRET|C60080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60080_01 - NS - Nova Scotia Liquor Commission (NSLC)|| RRET|C60081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60081_01 - Sobeys|| RRET|C60081_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60081_02 - Sobeys|| RRET|C60095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60095_01 - Galileo|| RRET|C60095_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60095_02 - GALILEO España S.L.|| RRET|C60096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60096_01 - Dollarama|| RRET|C60100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60100_01 - Sterling Shoes|| RRET|C60101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60101_01 - Provigo Inc.|| RRET|C60101_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60101_02 - Provigo Inc.|| RRET|C60102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60102_01 - Rexel Inc.|| RRET|C60102_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60102_02 - Rexel Inc.|| RRET|C60102_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60102_03 - Rexel Inc.|| RRET|C60104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60104_01 - Visual Retail|| RRET|C60104_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60104_02 - Visual Retail|| RRET|C60105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60105_01 - Perry Ellis International|| RRET|C60108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60108_01 - JC Penney|| RRET|C60109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60109_01 - Surf Stitch|| RRET|C60110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60110_01 - DG - Dollar General Corporation|| RRET|C60112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60112_01 - Dynamite|| RRET|C60115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60115_01 - Fred's Inc.|| RRET|C60116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60116_01 - Tractor Supply Company|| RRET|C60117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60117_01 - Cam-Trac Bernières Inc.|| RRET|C60118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60118_01 - Motovan|| RRET|C60119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60119_01 - El Corte Inglés|| RRET|C60121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60121_01 - The Beer Store|| RRET|C60121_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60121_02 - Brewers Retail Inc.|| RRET|C60122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60122_01 - Liz Claiborne Inc.|| RRET|C60122_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60122_02 - Liz Claiborne Inc.|| RRET|C60122_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60122_03 - Liz Claiborne Inc.|| RRET|C60123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60123_01 - Sonic Corporation|| RRET|C60124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60124_01 - Columbia Sportwear|| RRET|C60124_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60124_02 - Columbia Sportwear|| RRET|C60125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60125_01 - Retalix|| RRET|C60126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60126_01 - Couche-Tard|| RRET|C60126_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60126_02 - Alimentation Couche-Tard|| RRET|C60128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60128_01 - The Body Shop Canada|| RRET|C60130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60130_01 - Le Chateau|| RRET|C60132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60132_01 - USPA Properties Inc.|| RRET|C60133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60133_01 - Conrad Electronic SE|| RRET|C60134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60134_01 - Sur la Table Inc.|| RRET|C60135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60135_01 - Peter Justesen Company|| RRET|C60136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60136_01 - Advanced Auto Parts|| RRET|C60136_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60136_02 - Advanced Auto Parts|| RRET|C60137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60137_01 - Rôtisseries St-Hubert Ltée|| RRET|C60140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60140_01 - Groupe St-Hubert Inc.|| RRET|C60141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60141_01 - Dick's Sporting Goods|| RRET|C60145_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60145_01 - Ricoh Canada Inc.|| RRET|C60146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60146_01 - Forzani Group Ltd.|| RRET|C60147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60147_01 - L.L. Bean, Inc|| RRET|C60149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60149_01 - Billabong|| RRET|C60150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60150_01 - Hutchinson|| RRET|C60151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60151_01 - Bluebird Resources Ltd.|| RRET|C60153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60153_01 - Nordstrom, Inc.|| RRET|C60154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60154_01 - Tim Hortons Inc.|| RRET|C60155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60155_01 - Myer|| RRET|C60156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60156_01 - Coutie GmbH|| RRET|C60157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60157_01 - Planet Sports GmbH|| RRET|C60158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60158_01 - Trendfabrik AG|| RRET|C60160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60160_01 - Homeland Stores, Inc.|| RRET|C60161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60161_01 - becker + floege Gesellschaft mbH|| RRET|C60162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60162_01 - The business Depot - Staples|| RRET|C60163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60163_01 - Comtech EF Data Corp.|| RRET|C60164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60164_01 - FGL Sports Ltd.|| RRET|C60165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60165_01 - Kaiser's Tengelmann GmbH|| RRET|C60166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60166_01 - Celexon GmbH & Co. KG|| RRET|C60167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60167_01 - PVH Corp.|| RRET|C60168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60168_01 - General Pants|| RRET|C60169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60169_01 - Nero Bianco|| RRET|C60175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60175_01 - CETCO SA.|| RRET|C60220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60220_01 - The Brick Ltd.|| RRET|C60328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60328_01 - Sephora USA, Inc.|| RRET|C69999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C69999_01 - Other Sub Sector RRET|| RRET|C80210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80210_01 - Hela Spice Canada Inc|| RRET|C70382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C70382_01 - J Sainsbury plc|| RRET|C70537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C70537_01 - WOOLWORTHS LIMITED (Vendor No 73385001)|| RRET|C70547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C70547_01 - Media Other|| RRET|C80844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80844_01 - Inbev|| RRET|C80350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80350_01 - YANKEE CANDLE (EUROPE) LIMITED|| RRET|C80357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80357_01 - Skowronski & Koch Verlag GmbH|| RRET|C80360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80360_01 - Bremerhavener Versorgungs- und|| RRET|C80363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80363_01 - Telespazio VEGA Deutschland GmbH|| RRET|C80393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80393_01 - Richelieu Hardware Ltd.|| RRET|C80410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80410_01 - Distribuidora Internacional de Alimentación S.A.|| RRET|C80411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80411_01 - Sensormatic Electronics, LLC|| RRET|C80420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80420_01 - Reitmans (Canada) Limited|| RRET|C80468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80468_01 - Giant Eagle, Inc.|| RRET|C80517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80517_01 - Christies|| RRET|C80548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80548_01 - J_D_Williams|| RRET|C80585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80585_01 - RS_Components|| RRET|C80590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80590_01 - Selecta|| RRET|C80682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80682_01 - babymarkt.de GmbH|| RRET|C80692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80692_01 - Logitek Technology Ltd|| RRET|C80694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80694_01 - Sears Home Services|| RRET|C81168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81168_01 - Neiman Marcus, Inc.|| RRET|C81255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81255_01 - SUPERMERCADOS PERUANOS|| RRET|C81300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81300_01 - LeGroupeAldo|| RRET|C81397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81397_01 - Informática El Corte Inglés SA (IECISA)|| RRET|C81435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81435_01 - Luxury Fashion Trade GmbH|| RRET|C81436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81436_01 - Les Jardins Val-Mont Inc.|| RRET|C10647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10647_01 - ASO - Aircraft Shopper Online|| RRET|C10770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10770_01 - InBev Ltd|| RRET|C51646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51646_01 - Travel Retail Norway AS|| RRET|C81411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81411_01 - IGSA MOTIVA CONSULTING-ADT UTE|| RRET|C81517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81517_01 - Kirkland's, Inc.|| RRET|C81534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81534_01 - Ivanhoe Cambridge Inc.|| RRET|C51857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51857_01 - H&M|| RRET|C80261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80261_01 - LOBLAWS INC.|| RRET|C10359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10359_01 - Pecca Investment|| RRET|C10564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10564_01 - m0851 Inc.|| RRET|C10575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10575_01 - Tribal Sportswear Inc.|| RRET|C10638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10638_01 - Novexco Inc.|| RRET|C22244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C22244_01 - Confecciones Paris, C.A.|| RRET|C51187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51187_01 - Byggtrygg|| RRET|C51268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51268_01 - Food and Beverage|| RRET|C51336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51336_01 - Jeronimo Martins|| RRET|C51416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51416_01 - Natura|| RRET|C51790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51790_01 - Moelven|| RRET|C51848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51848_01 - Axfood|| RRET|C51851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51851_01 - Byggtrygg|| RRET|C51855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51855_01 - Ellos|| RRET|C51859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51859_01 - ICA|| RRET|C51862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51862_01 - KF|| RRET|C51864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51864_01 - Lindex|| RRET|C51866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51866_01 - Mekonomen|| RRET|C51872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51872_01 - Retail/CPG|| RRET|C51881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51881_01 - Systembolaget|| RRET|C60001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60001_01 - Ontario Inc.|| RRET|C60004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60004_01 - Redberry Resto Brands Inc.|| RRET|C60006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60006_01 - Laura's Shoppe Inc.|| RRET|C60007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60007_01 - Au Pain Doré Ltd|| RRET|C60008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60008_01 - Balnea Inc.|| RRET|C60012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60012_01 - Au Pain Doré Ltd|| RRET|C60013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60013_01 - Première Moisson|| RRET|C60016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60016_01 - Canadian Tire|| RRET|C60017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60017_01 - Cara Operations Limited|| RRET|C60018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60018_01 - Cavalli Royal Inc.|| RRET|C60019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60019_01 - Centre du rasoir|| RRET|C60021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60021_01 - Club Tissus Rive-Sud|| RRET|C60022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60022_01 - Club Proform|| RRET|C60023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60023_01 - Colliers International|| RRET|C60027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60027_01 - eClub Select|| RRET|C60033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60033_01 - Groupe Yellow Inc.|| RRET|C60034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60034_01 - HMV Canada Inc.|| RRET|C60036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60036_01 - La boite noire|| RRET|C60038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60038_01 - L'Allemand|| RRET|C60039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60039_01 - L'Aubainerie Concept Mode|| RRET|C60040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60040_01 - Laurysen Kitchens Ltd|| RRET|C60041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60041_01 - Party City Corporation|| RRET|C60042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60042_01 - Les Boutiques San Francisco Inc.|| RRET|C60043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60043_01 - Les vehicules d'� cote Inc.|| RRET|C60049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60049_01 - Métro Élite St-Jérome|| RRET|C60050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60050_01 - Métro Ouellette|| RRET|C60055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60055_01 - Old Bike Barn Inc.|| RRET|C60056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60056_01 - Omer DeSerres|| RRET|C60057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60057_01 - Personal Edge|| RRET|C60058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60058_01 - Pièces automobiles Lecavalier Inc.|| RRET|C60061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60061_01 - Rasoirs et Lames Ste-Foy Inc.|| RRET|C60068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60068_01 - Target Stores|| RRET|C60068_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60068_02 - Target Stores|| RRET|C60071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60071_01 - Tristan and Iseut|| RRET|C60076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60076_01 - Xerox Canada|| RRET|C60076_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60076_02 - Xerox|| RRET|C60085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60085_01 - LeNôtre|| RRET|C60089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60089_01 - Albertson's|| RRET|C60090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60090_01 - Dupont|| RRET|C60097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60097_01 - Produits Standards Inc.|| RRET|C60098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60098_01 - Christopher's Furniture Services Ltd|| RRET|C60099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60099_01 - Les Distributeurs R. Nicholls|| RRET|C60103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60103_01 - Germain Lariviere|| RRET|C60107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60107_01 - Aeon Group Inc.|| RRET|C60111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60111_01 - Mega Group|| RRET|C60114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60114_01 - ACCO Brands|| RRET|C60127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60127_01 - Mark's Work Wearhouse|| RRET|C60131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60131_01 - Greenleaf Auto|| RRET|C60142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60142_01 - International Electric Supply Corp.|| RRET|C60142_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60142_02 - International Electric Supply Corp.|| RRET|C60143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60143_01 - Librairie Renaud-Bray|| RRET|C60187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C60187_01 - GRUPO SANTI S.A.C|| RRET|C80238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80238_01 - RH Brown and Company, LLC|| RRET|C80430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80430_01 - GEOFFREY DRAYTON|| RRET|C80430_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80430_02 - GEOFFREY DRAYTON|| RRET|C80479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80479_01 - Asaren Orbis, S.L.|| RRET|C80611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80611_01 - Zendor_GSI|| RRET|C81116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81116_01 - Inbev UK Limited|| RRET|C51860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51860_01 - Ikea|| RRET|C10058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10058_01 - Banner Retail Marketing Group|| RRET|C10071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10071_01 - Boulangerie Lanthier Ltée|| RRET|C10224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10224_01 - Groupe Océan Inc.|| RRET|C10280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10280_01 - LCBO Durham Logistics Facility|| RRET|C10289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10289_01 - Loeb Canada Inc.|| RRET|C51352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51352_01 - Kiwi Danmark A/S|| RRET|C51283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51283_01 - GALERIES LAFAYETTE|| RRET|C81559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81559_01 - PETER STUPP DESIGN Mode GmbH|| RRET|C81607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81607_01 - Apptus Technologies AB|| RRET|C81617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81617_01 - Dagrofa aps|| RRET|C81665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81665_01 - Form3 Retail ApS|| RRET|C81665_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81665_03 - C81665_01 - Form3 Retail ApS|| RRET|C81716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81716_01 - Coles Supermarkets|| RRET|C81737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81737_01 - C81737_01 - ALCAMPO S.A.|| RRET|C81747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81747_01 - Levi Strauss & Co.|| RRET|C81776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81776_01 - Moelven Nordia AS|| RRET|C81914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81914_01 - Advance Stores Company Inc|| RRET|C80261_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C80261_02 - Loblaw Companies Limited|| RRET|C81063_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C81063_02 - Xerox State Healthcare|| RRET|C51194_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51194_13 - CARREFOUR|| RRET|C82022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82022_01 - DSG Retail Limited|| RRET|C82029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82029_01 - Groupe Dynamite|| RRET|C51460_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_08 - OTHERS - RETAIL|| RRET|C31572_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C31572_07 - OTHERS CENTRAL ADMINISTRATIONS|| RRET|C51195_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_12 - CASINO|| RRET|C51460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_01 - OTHERS - RETAIL|| RRET|C51195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51195_01 - CASINO|| RRET|C82088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82088_01 - Jula AB|| RRET|C82090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82090_01 - Rusta AB|| RRET|C82230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82230_01 - Rexel Finland Oy|| RRET|C82245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82245_01 - Wal-Mart Canada Corp|| RRET|C82265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82265_01 - Nygard International Partnership|| RRET|C82273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82273_01 - Coop Sverige AB|| RRET|C82278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82278_01 - Pre Cast Technology AB|| RRET|C82363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82363_01 - North West Company LP, The|| RRET|C82380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82380_01 - Sterling Jewelers Inc.|| RRET|C82397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82397_01 - Best Buy Canada Ltd.|| RRET|C82423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82423_01 - LOUIS VUITTON MALLETIER|| RRET|C82516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82516_01 - LIDL Stiftung & Co. KG|| RRET|C82613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82613_01 - Total Dollar|| RRET|C82916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82916_01 - FRIEDMAN'SINC.|| RRET|C82917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82917_01 - CLAIRE'S|| RRET|C82922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C82922_01 - GOTTSCHALKS,INC|| RRET|C83065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83065_01 - Dollarama Inc.|| RRET|C83073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83073_01 - Dormez Vous|| RRET|C83075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83075_01 - Target Corporation|| RRET|C83130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83130_01 - Sears Canada Inc|| RRET|C83173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83173_01 - Motorfirman Holger Duell AB|| RRET|C83166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83166_01 - Sneakersnstuff|| RRET|C83219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83219_01 - National Art Center|| RRET|C83226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83226_01 - SHI International Corp|| RRET|C83230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83230_01 - Kelda Retail|| RRET|C83263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83263_01 - BC Liquor Distribution Branch|| RRET|C83314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83314_01 - Oriveden Leipomo Oy|| RRET|C83316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83316_01 - Oriveden Leipomo Oy|| RRET|C83338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83338_01 - Royal Design Group|| RRET|C83394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83394_01 - Tractor Supply Company|| RRET|C51143_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51143_13 - AUCHAN|| RRET|C51460_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C51460_13 - OTHERS - RETAIL|| RRET|C83498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83498_01 - Dunkin' Brands, Inc.|| RRET|C83526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83526_01 - Rue La La, Inc.|| RRET|C83537_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83537_01 - The J. Jill Group, Inc.|| RRET|C83540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83540_01 - TJX Companies|| RRET|C83548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83548_01 - Academy Sports Outdoors|| RRET|C83552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83552_01 - Dollar General|| RRET|C83779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83779_01 - BRUNO'S SUPERMARKETS, LLC|| RRET|C83793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83793_01 - Central Source LLC|| RRET|C83849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83849_01 - Dick's Sporting Goods|| RRET|C83852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83852_01 - DOLLAR GENERAL CORPORATION|| RRET|C83898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83898_01 - GOTTSCHALKS, INC|| RRET|C83943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83943_01 - Kirkland|| RRET|C83975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83975_01 - MI9 BUSINESS INTELLIGENCE SYS|| RRET|C83998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C83998_01 - Neiman Marcus|| RRET|C84002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84002_01 - NEWTON & NEWTON|| RRET|C84051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84051_01 - Reebok International|| RRET|C84099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84099_01 - Sterling Jewelers Inc.|| RRET|C84126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84126_01 - Tractor Supply Company|| RRET|C84216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84216_01 - Smart Hub AS|| RRET|C21930_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C21930_02 - FNAC|| RRET|C21930_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C21930_03 - FNAC|| RRET|C21930_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C21930_07 - FNAC|| RRET|C21931_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C21931_07 - INTERMARCHE|| RRET|C21931_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C21931_12 - INTERMARCHE|| RRET|C21933_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C21933_02 - LECLERC|| RRET|C21933_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C21933_07 - LECLERC|| RRET|C84236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84236_01 - Genesco|| RRET|C84267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84267_01 - Harris Teeter|| RRET|C84268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84268_01 - National Seating and Mobility|| RRET|C84306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84306_01 - Aaron's|| RRET|C84317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84317_01 - Longo Brothers Fruit Markets Inc.|| RRET|C84323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84323_01 - Sears Canada|| RRET|C84414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84414_01 - Kirkland's, Inc.|| RRET|C84390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C84390_01 - HIGHLAND GROUP HOLDINGS AS|| Retail_and_Consumer_Services|RDWH|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| RDWH|C10022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10022_01 - Wolseley Holdings Canada Inc.|test desc| RDWH|C10022_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10022_02 - Wolseley Holdings Canada Inc.|| RDWH|C10022_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10022_03 - Wolseley Holdings Canada Inc.|| RDWH|C11030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C11030_01 - Methanex Corporation|| RDWH|C19999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C19999_03 - Other Sub Sector RDWH|| RDWH|C51188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51188_01 - C.H.Guenther|| RDWH|C51196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51196_01 - Celesio|| RDWH|C51226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51226_01 - Danish Agro A.m.b.a|| RDWH|C51229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51229_01 - Delta Cafes|| RDWH|C51283_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_02 - GALERIES LAFAYETTE|| RDWH|C51283_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_03 - GALERIES LAFAYETTE|| RDWH|C51283_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_04 - GALERIES LAFAYETTE|| RDWH|C51283_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_05 - GALERIES LAFAYETTE|| RDWH|C51283_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_06 - GALERIES LAFAYETTE|| RDWH|C51283_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_07 - GALERIES LAFAYETTE|| RDWH|C51283_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_09 - GALERIES LAFAYETTE|| RDWH|C51304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51304_01 - Honda|| RDWH|C51312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51312_01 - IBM|| RDWH|C51325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51325_01 - Interpress Norge AS|| RDWH|C51351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51351_01 - Kirjavalitys Oy|| RDWH|C51353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51353_01 - Kjær Group A/S|| RDWH|C51355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51355_01 - kk-electronic a/s|| RDWH|C51393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51393_01 - Menigo Foodservice|| RDWH|C51025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51025_01 - UAP Inc.|| RDWH|C51111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51111_01 - Ahlsell|| RDWH|C51120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51120_01 - Altana Pharma AG|| RDWH|C51128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51128_01 - Apoteksmarknad|| RDWH|C51173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51173_01 - BMW|| RDWH|C51586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51586_01 - Starco Europe A/S|| RDWH|C51591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51591_01 - Stena Metall|| RDWH|C51631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51631_01 - Tidsam AB|| RDWH|C51657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51657_01 - Univeg|| RDWH|C51659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51659_01 - Uwe Kloska|| RDWH|C51683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51683_01 - Adidas-Salomon AG|| RDWH|C51920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51920_01 - Agro Partnere|| RDWH|C51938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51938_01 - BB Distribution, Denmark A/S|| RDWH|C51946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51946_01 - Bio-Rad Laboratories AB|| RDWH|C51961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51961_01 - Brands4kids A/S|| RDWH|C51987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51987_01 - CD COMPANY OF SCANDINAVIA A/S|| RDWH|C52079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52079_01 - GASA Odense Frugt-Grønt. A.m.b.A.|| RDWH|C51456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51456_01 - OTHERS - CPG|| RDWH|C51456_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51456_03 - OTHERS - CPG|| RDWH|C51456_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51456_04 - OTHERS - CPG|| RDWH|C51456_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51456_05 - OTHERS - CPG|| RDWH|C51456_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51456_06 - OTHERS - CPG|| RDWH|C51456_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51456_08 - OTHERS - CPG|| RDWH|C51499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51499_01 - Procter & Gamble|| RDWH|C51501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51501_01 - Puukeskus Oy|| RDWH|C51504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51504_01 - Ragn-Sells|| RDWH|C52137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52137_01 - K.H. FRUGT A/S|| RDWH|C52146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52146_01 - Krogsgaard Kompagni A/S|| RDWH|C52168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52168_01 - LTP Denmark A/S|| RDWH|C52217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52217_01 - Partner Herning A/S|| RDWH|C52231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52231_01 - Procurator a/s|| RDWH|C52236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52236_01 - Ragtex ApS|| RDWH|C52241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52241_01 - Reitan Distribution A/S|| RDWH|C52252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52252_01 - Sanistål A/S (8787)|| RDWH|C52261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52261_01 - Scan-Horse A/S|| RDWH|C52265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52265_01 - Scansport A/S|| RDWH|C52269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52269_01 - Schneider Electric Buildings Sweden AB|| RDWH|C52293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52293_01 - Svejsehuset A/S|| RDWH|C52318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C52318_01 - Valora Trade Denmark A/S|| RDWH|C60138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C60138_01 - UAP Inc.|| RDWH|C60139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C60139_01 - Lumen|| RDWH|C70377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C70377_01 - INTERMEC|| RDWH|C70423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C70423_01 - OK a.m.b.a|| RDWH|C70511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C70511_01 - T-Systems|| RDWH|C70542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C70542_01 - COIN|| RDWH|C80498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C80498_01 - Avnet|| RDWH|C10329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10329_01 - MSC Industrial Direct Company Inc.|| RDWH|C10486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10486_01 - Uni-Select Inc.|| RDWH|C10486_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10486_03 - Uni-Select Inc.|| RDWH|C10486_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10486_04 - Uni-Sélect Inc.|| RDWH|C10486_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10486_05 - Uni-Sélect Inc.|| RDWH|C10571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10571_01 - Spartan Controls|| RDWH|C10767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10767_01 - Arrow Electronics|| RDWH|C10767_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10767_03 - Arrow Electronics (DMS)|| RDWH|C10768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10768_01 - Oce North America|| RDWH|C10768_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10768_02 - Oce North America|| RDWH|C10768_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10768_03 - Oce North America|| RDWH|C10768_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10768_04 - OCE|| RDWH|C10828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10828_01 - GFS - Gordon Food Service Canada|| RDWH|C10828_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10828_02 - GFS - Gordon Food Service Canada|| RDWH|C10864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10864_01 - Sonepar|| RDWH|C10889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10889_01 - Liteco|| RDWH|C10923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10923_01 - Finning Canada|| RDWH|C10210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10210_01 - GFS Canada Company Inc.|| RDWH|C20483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C20483_01 - RDM Wholesale|| RDWH|C20483_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C20483_02 - RDM Wholesale|| RDWH|C50038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C50038_01 - Honda|| RDWH|C50351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C50351_01 - Kenworth Montréal|| RDWH|C50509_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C50509_02 - Procter and Gamble Inc.|| RDWH|C50509_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C50509_03 - Procter and Gamble Inc.|| RDWH|C10510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10510_01 - Westburne Electrical Supply|| RDWH|C10104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10104_01 - Export 2002 Inc.|| RDWH|C10175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10175_01 - Vast- Auto Distribution|| RDWH|C10202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10202_01 - Future Electronics Inc.|| RDWH|C10228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10228_01 - Guillevin International Company|| RDWH|C10232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10232_01 - Hector Larivée Inc.|| RDWH|C10278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10278_01 - Les viandes et aliments Or-Fil Canada|| RDWH|C10395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10395_01 - York Chicken Wholesale Ltd|| RDWH|C10900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10900_01 - MSC Industrial Supply|| RDWH|C11180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C11180_01 - CRANE GROUP LIMITED (Supplier No. 656282)|| RDWH|C22283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C22283_01 - SANDRA PATRICIA CIFUENTES RUIZ|| RDWH|C40300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C40300_01 - Region Hovedstaden|| RDWH|C51221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51221_01 - Dagab AB|| RDWH|C51609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51609_01 - SYSTEM U|| RDWH|C51609_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51609_02 - SYSTEM U|| RDWH|C51609_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51609_03 - SYSTEM U|| RDWH|C51609_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51609_04 - SYSTEM U|| RDWH|C51609_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51609_05 - SYSTEM U|| RDWH|C51609_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51609_06 - SYSTEM U|| RDWH|C51611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51611_01 - Tamro|| RDWH|C51630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51630_01 - Tibnor|| RDWH|C51735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51735_01 - BMW|| RDWH|C51819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51819_01 - Stena Metall|| RDWH|C51844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51844_01 - Ahlsell|| RDWH|C51845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51845_01 - Apoteksmarknad|| RDWH|C51850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51850_01 - BTJ|| RDWH|C51867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51867_01 - Menigo Foodservice|| RDWH|C51868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51868_01 - OK-Q8|| RDWH|C51871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51871_01 - Procter & Gamble|| RDWH|C51898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51898_01 - Ragn-Sells|| RDWH|C60197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C60197_01 - NEXSYS DEL PERU SAC.|| RDWH|C80291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C80291_01 - Unlimited Cubicles Liquidation|| RDWH|C80300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C80300_01 - Unlimited Cubicles Liquidation|| RDWH|C10156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10156_01 - Direct Distribution Centres|| RDWH|C10162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10162_01 - Dubé et Loiselle Inc.|| RDWH|C10219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10219_01 - Groupe Deschênes Inc.|| RDWH|C10295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10295_01 - Lumen|| RDWH|C10850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C10850_01 - Yurcor / Intel|| RDWH|C81635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C81635_01 - ACTE|| RDWH|C81883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C81883_01 - Distribution Pneus RT|| RDWH|C82308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C82308_01 - Svensk Cater AB|| RDWH|C82322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C82322_01 - Martin & Servera AB|| RDWH|C82454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C82454_01 - Schl�sser M�ller|| RDWH|C82525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C82525_01 - Brenntag AG|| RDWH|C82553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C82553_01 - ARROW ELECTRONICS|| RDWH|C82560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C82560_01 - Acklands-Grainger Inc.|| RDWH|C83158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83158_01 - Toshiba Information Systems (UK) Ltd|| RDWH|C83195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83195_01 - Weda Skog AB|| RDWH|C83217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83217_01 - Prinoth Lt?e|| RDWH|C83252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83252_01 - Metro Inc.|| RDWH|C83280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83280_01 - Verifone Finland Oy|| RDWH|C83281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83281_01 - Verifone Finland Oy|| RDWH|C83247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83247_01 - MM Electrical Merchandising|| RDWH|C83357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83357_01 - CANAC|| RDWH|C83363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83363_01 - COIN|| RDWH|C83383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83383_01 - NorgesGruppen|| RDWH|C51283_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51283_13 - GALERIES LAFAYETTE|| RDWH|C83463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83463_01 - Handicare AB|| RDWH|C83471_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83471_01 - CANAC|| RDWH|C83465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83465_01 - Schl?sser M?ller|| RDWH|C83571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83571_01 - Nordic Aviation Capital A/S|| RDWH|C83572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83572_01 - A/S Bevola|| RDWH|C83573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83573_01 - Hempel A/S|| RDWH|C51430_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51430_12 - SYST?ME U|| RDWH|C51430_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C51430_13 - SYSTEME U|| RDWH|C83665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83665_01 - MSC Industrial Supply Co.|| RDWH|C83675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83675_01 - Levi Strauss & Company|| RDWH|C83682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83682_01 - COOP Centrum Druzstvo|| RDWH|C83814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83814_01 - Claire's|| RDWH|C83959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C83959_01 - MANHEIM AUCTIONS, INC.|| RDWH|C84270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C84270_01 - Dixie Plywood & Lumber Company|| RDWH|C84271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C84271_01 - Vision Wheel|| RDWH|C84373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RDWH_Att|C84373_01 - Soprema|| Retail_and_Consumer_Services|RSER|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| RSER|C10001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10001_01 - /n Spro Inc.|| RSER|C10003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10003_01 - Mandiant Corporation|| RSER|C10006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10006_01 - Corporation de l'Opéra de Montréal (1980) Inc, La|| RSER|C10007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10007_01 - Accenture (Australia)|| RSER|C10007_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10007_02 - Accenture|| RSER|C10007_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10007_03 - Accenture|| RSER|C10007_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10007_04 - Accenture (Australia)|| RSER|C10007_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10007_05 - Accenture LLP|| RSER|C10021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10021_01 - AB - Council of Disability Services (ACDS)|| RSER|C10025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10025_01 - Allegro Residences|| RSER|C10025_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10025_02 - Allegro Residences|| RSER|C10025_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10025_03 - Allegro Residences|| RSER|C10027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10027_01 - Allied Research International|| RSER|C10030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10030_01 - Amaranth Consulting Group|| RSER|C10032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_01 - HP - Hewlett-Packard Inc.|| RSER|C10032_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_02 - HP - Hewlett-Packard Inc.|| RSER|C10032_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_03 - HP - Hewlett-Packard Inc.|| RSER|C81403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81403_01 - HWG Danmark|| RSER|C81405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81405_01 - Logica North America Inc|| RSER|C81419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81419_01 - FHTopholding2 AB|| RSER|C81420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81420_01 - Trust Combinator AB|| RSER|C81424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81424_01 - Infosec Global|| RSER|C81425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81425_01 - Infotec America|| RSER|C81426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81426_01 - Kili Technologies Inc|| RSER|C81428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81428_01 - Cyberian Data Protection|| RSER|C81430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81430_01 - Fujitsu Conseil (Canada) Inc.|| RSER|C81439_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81439_01 - Kerry's Place Autism Services|| RSER|C81456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81456_01 - Central East Community Care Access Centre Found.|| RSER|C10317_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10317_02 - Micro Focus|| RSER|C10318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10318_01 - Microsoft Corporation|| RSER|C10318_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10318_02 - Microsoft Corporation|| RSER|C10318_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10318_06 - Microsoft Corporation|| RSER|C10318_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10318_07 - Microsoft Corporation|| RSER|C10328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10328_01 - Morneau Sobeco|| RSER|C10372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10372_01 - Procom Consultants Group|| RSER|C10372_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10372_02 - Procom Consultants Group|| RSER|C10379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10379_01 - Kal Tire|| RSER|C10389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10389_01 - R and D Products|| RSER|C10394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10394_01 - Red Dog Systems Inc.|| RSER|C10408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10408_01 - S.I. Systems Inc.|| RSER|C10408_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10408_02 - S.I. Systems Inc.|| RSER|C10413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10413_01 - Viterra|| RSER|C10426_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10426_02 - Sigedoc Inc.|| RSER|C10444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10444_01 - Sproule Associates Limited|| RSER|C10448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10448_01 - Steria Suisse|| RSER|C10448_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10448_02 - Steria Suisse|| RSER|C10448_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10448_03 - STERIA|| RSER|C10448_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10448_04 - Steria|| RSER|C10448_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10448_05 - Steria Suisse|| RSER|C10483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10483_01 - UDA - Union des Artistes|| RSER|C10483_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10483_02 - UDA - Union des Artistes|| RSER|C10485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10485_01 - UPA - Union des producteurs agricoles|| RSER|C10498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10498_01 - Veritaaq Technology House Inc.|| RSER|C10498_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10498_02 - Veritaaq Technology House Inc.|| RSER|C10502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10502_01 - Viewpoint Technologies Ltd|| RSER|C10516_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10516_02 - WVO - Wyndham Vacation Ownership|| RSER|C10516_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10516_03 - WVO - Wyndham Vacation Ownership|| RSER|C10516_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10516_04 - WVO - Wyndham Vacation Ownership|| RSER|C10516_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10516_05 - WVO - Wyndham Vacation Ownership|| RSER|C10519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10519_01 - Zetec Inc.|| RSER|C10522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10522_01 - Calgary Parking Authority|| RSER|C10527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10527_01 - Medisolution Inc.|| RSER|C10531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10531_01 - Aurel|| RSER|C10532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10532_01 - BuyingPack|| RSER|C10534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10534_01 - Oberthur Card Systems|| RSER|C10538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10538_01 - TUI Travel|| RSER|C10551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10551_01 - T-Systems Limited|| RSER|C10551_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10551_02 - T-Systems Multimedia Solutions GmbH|| RSER|C10553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10553_01 - Logica CMG Limited|| RSER|C10554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10554_01 - Mars Information|| RSER|C10557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10557_01 - PJD Solutions Group Ltd|| RSER|C10559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10559_01 - Tealeaf Technology Ltd|| RSER|C10567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10567_01 - xwave|| RSER|C10567_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10567_02 - xwave|| RSER|C10570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10570_01 - Deloitte et Touche|| RSER|C10570_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10570_02 - Deloitte Consulting LLP|| RSER|C10570_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10570_03 - Deloitte Consulting LLP|| RSER|C10570_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10570_04 - Deloitte & Touche Inc.|| RSER|C10578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10578_01 - Sergel|| RSER|C10578_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10578_02 - Sergel|| RSER|C10579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10579_01 - Trixan Ltd|| RSER|C10581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10581_01 - Stoker Resources Group|| RSER|C10583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10583_01 - Diligenta|| RSER|C10632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10632_01 - Atex Formulaires d'Affaires|| RSER|C10636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10636_01 - Les Produits Scientific Games|| RSER|C10639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10639_01 - Opération Enfant Soleil|| RSER|C10639_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10639_02 - Opération Enfant Soleil|| RSER|C10644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10644_01 - GICR - Groupement informatique des caisses de retraite|| RSER|C10651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10651_01 - PMU - Pari mutuel urbain|| RSER|C10653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10653_01 - Dibocca|| RSER|C10689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10689_01 - Alexander Mann Solutions|| RSER|C10691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10691_01 - RD Trading Limited|| RSER|C10692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10692_01 - Ventura|| RSER|C10692_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10692_02 - Ventura|| RSER|C10692_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10692_03 - Ventura|| RSER|C10692_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10692_04 - CA - Ventura County|| RSER|C10698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10698_01 - Fasken Martineau Dumoulin|| RSER|C10705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10705_01 - Services informatiques INFODU|| RSER|C10708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10708_01 - GFI Solutions Inc.|| RSER|C10708_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10708_02 - GFI Solutions Inc.|| RSER|C10719_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10719_02 - AOL Inc|| RSER|C10720_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10720_01 - CFNI - Community Foundation of Northwest Indiana|| RSER|C10720_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10720_02 - CFNI - Community Foundation of Northwest Indiana|| RSER|C10721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10721_01 - Casiloc Inc.|| RSER|C10721_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10721_02 - Casiloc Inc.|| RSER|C10724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10724_01 - Groupe Techna Inc.|| RSER|C10737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10737_01 - Keystone Accounting Solutions Inc.|| RSER|C10749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10749_01 - Adoma|| RSER|C10752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10752_01 - Joseph Élie Ltée|| RSER|C10755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10755_01 - Amadeus|| RSER|C10756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10756_01 - EGM Solutions|| RSER|C10756_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10756_02 - EGM Solutions|| RSER|C10759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10759_01 - FDJ - Française des Jeux|| RSER|C10759_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10759_02 - FDJ - Française des Jeux|| RSER|C10760_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10760_01 - L-IPSE Services Conseil|| RSER|C10760_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10760_02 - L-IPSE Services Conseil|| RSER|C10765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10765_01 - Congres Mondial de l'energie (Montreal)|| RSER|C10769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10769_01 - Securitas Direct|| RSER|C10777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10777_01 - Savvion Inc.|| RSER|C10779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10779_01 - Ladbrokes Ltd|| RSER|C10779_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10779_02 - Ladbrokes Ltd|| RSER|C10783_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10783_01 - SMS Management and Technology|| RSER|C10784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10784_01 - InfraServ Knapsack|| RSER|C10788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10788_01 - Acctus|| RSER|C10789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10789_01 - Groupe Mallette|| RSER|C10794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10794_01 - BASE - Basel Agency for Sustainable Energy|| RSER|C10794_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10794_02 - BASE - Basel Agency for Sustainable Energy|| RSER|C10801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10801_01 - Infynia Technologies Inc.|| RSER|C10806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10806_01 - Business Aspect|| RSER|C10817_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10817_01 - PMU - Pari mutuel urbain|| RSER|C10818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10818_01 - Halcon Viajes|| RSER|C10821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10821_01 - SPAQ - Société Parc-Auto du Québec|| RSER|C10829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10829_01 - CT-PAIEMENT|| RSER|C10831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10831_01 - A and W Food Services of Canada Inc.|| RSER|C10832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10832_01 - Oxygene Sante Corporative|| RSER|C10832_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10832_02 - Oxygène Santé Corporative|| RSER|C10833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10833_01 - Ernst and Young|| RSER|C10834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10834_01 - Secor|| RSER|C10838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10838_01 - Kinsale Group|| RSER|C10841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10841_01 - Extelia|| RSER|C10843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10843_01 - Fujitsu Conseil|| RSER|C10843_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10843_02 - Fujitsu Conseil (Canada) Inc|| RSER|C10849_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10849_01 - SII - Société pour l'informatique industrielle|| RSER|C10852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10852_01 - CDMV - Centre de distribution de médicaments vétérinaires|| RSER|C10852_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10852_02 - CDMV - Centre de distribution de medicaments veterinaires|| RSER|C10853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10853_01 - Online Brands|| RSER|C10855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10855_01 - Novus Consulting Group Ltd|| RSER|C10858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10858_01 - ATR|| RSER|C10860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10860_01 - Calgary Telus Convention Centre|| RSER|C10871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10871_01 - QlikTech|| RSER|C10873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10873_01 - Cinram International Inc.|| RSER|C10874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10874_01 - Smart Technologies|| RSER|C10874_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10874_02 - Smart Technologies|| RSER|C10876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10876_01 - Novabase|| RSER|C10877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10877_01 - Quotambiental|| RSER|C10880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10880_01 - Nexacor|| RSER|C10880_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10880_02 - Nexacor|| RSER|C10881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10881_01 - Lane Land Services Ltd|| RSER|C10882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10882_01 - Periscope|| RSER|C10883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10883_01 - FFTIR - Fédération francaise de tir|| RSER|C10884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10884_01 - Oeildelynx.ca|| RSER|C10888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10888_01 - Microsoft Corporation|| RSER|C10888_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10888_02 - Microsoft Corporation|| RSER|C10892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10892_01 - Canadian Blood Services|| RSER|C10894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10894_01 - Ferroser|| RSER|C10897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10897_01 - Optimum Public Relations|| RSER|C10898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10898_01 - ACS - Affliated Computer Systems|| RSER|C10902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10902_01 - Consolidated Civil Enforcement Inc.|| RSER|C10903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10903_01 - Atlantic Technologies|| RSER|C10904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10904_01 - PTI Solutions d'affaires|| RSER|C10906_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10906_01 - Ivalua|| RSER|C10907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10907_01 - CEVA Logistics|| RSER|C10908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10908_01 - A1L Realizations Ltd|| RSER|C10908_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10908_02 - A1L Realizations Ltd|| RSER|C10910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10910_01 - Spainsoft|| RSER|C10911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10911_01 - Yakima Valley Technical Skills Center|| RSER|C10917_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10917_01 - BCMB - Beverage Container Management Board|| RSER|C10920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10920_01 - Grantium Inc.|| RSER|C10922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10922_01 - Groupe Perspective|| RSER|C10924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10924_01 - Forte Advisors AG|| RSER|C10926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10926_01 - Koch Business Solutions|| RSER|C10032_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_05 - HP - Hewlett Packard|| RSER|C10032_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_06 - HP - Hewlett Packard Financial Services Canada|| RSER|C10032_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_07 - HP - Hewlett Packard POLSKA SP. Z.O.O|| RSER|C10032_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_08 - Hewlett-Packard Fin Services Canada|| RSER|C10032_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_09 - HEWLETT-PACKARD SERVICIOS ESPAc, S.L.|| RSER|C10032_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_10 - HEWLETT PACKARD INTERNATIONAL BANK PLC|| RSER|C10032_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_11 - HEWLETT PACKARD INTERNATIONAL BANK PLC|| RSER|C10042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10042_01 - Arrow Welding and Industrial Supplies Inc.|| RSER|C10064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10064_01 - Belron Canada Inc.|| RSER|C10083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10083_01 - CSN - Confédération des syndicats nationaux|| RSER|C10089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10089_01 - CME - Canadian Manufacturers and Exporters|| RSER|C10098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10098_01 - Centraide du Grand Montreal|| RSER|C10101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10101_01 - CRIM - Centre de recherche informatique de Montreal|| RSER|C10106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10106_01 - Cirque du Soleil|| RSER|C10106_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10106_03 - Cirque du Soleil|| RSER|C10106_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10106_04 - Cirque du Soleil|| RSER|C10106_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10106_05 - Cirque du Soleil|| RSER|C10106_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10106_06 - Cirque du Soleil|| RSER|C10106_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10106_07 - Cirque du Soleil|| RSER|C10106_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10106_08 - Cirque du Soleil|| RSER|C10114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10114_01 - CCQ - Commission de la construction du Quebec|| RSER|C10114_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10114_02 - CCQ - Commission de la construction du Québec|| RSER|C10114_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10114_03 - CCQ - Commission de la construction du Quebec|| RSER|C10114_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10114_04 - CCQ - Commission de la construction du Québec|| RSER|C10116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10116_01 - Compro Communications Inc.|| RSER|C10117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10117_01 - Computer Associates Inc.|| RSER|C10122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10122_01 - Conseil des Montagnais du Lac-St-Jean (GMA_ISIT)|| RSER|C10128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10128_01 - Aecon|| RSER|C10128_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10128_02 - Aecon|| RSER|C10134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10134_01 - CPAS Systems Inc.|| RSER|C10134_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10134_02 - CPAS Systems Inc.|| RSER|C10134_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10134_03 - CPAS Systems Inc.|| RSER|C10144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10144_01 - DMI - Daishowa-Marubeni International Ltd|| RSER|C10149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10149_01 - Delcan Corporation|| RSER|C10150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10150_01 - Deloitte Management Services|| RSER|C10150_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10150_02 - Deloitte Management Services|| RSER|C10152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10152_01 - Dessau|| RSER|C10152_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10152_02 - Dessau|| RSER|C10152_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10152_03 - Dessau inc.|| RSER|C10153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10153_01 - Digital Adrenaline|| RSER|C10157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10157_01 - DMR|| RSER|C10157_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10157_02 - Fujitsu Conseil (Canada) Inc|| RSER|C10159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10159_01 - Domaine Forget de Charlevoix Inc.|| RSER|C10161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10161_01 - Drakkar|| RSER|C10178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10178_01 - Environment Saint-Laurent Inc.|| RSER|C10186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10186_01 - Expertech Network Installation|| RSER|C10197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10197_01 - Procure|| RSER|C10218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10218_01 - Groupe Constructo|| RSER|C10218_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10218_02 - Groupe Constructo|| RSER|C10221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10221_01 - Groupe Environnemental Labrie|| RSER|C10221_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10221_02 - Groupe Environnemental Labrie|| RSER|C10222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10222_01 - Groupe Helios Inc.|| RSER|C10225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10225_01 - Groupe YGS inc.|| RSER|C10250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10250_01 - Institut Rosell Inc.|| RSER|C10255_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10255_02 - Open Text Corporation|| RSER|C10259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10259_01 - Journal de Québec|| RSER|C10274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10274_01 - La Presse Ltée|| RSER|C10302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10302_01 - TechSolCom|| RSER|C10306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10306_01 - Marchex Inc.|| RSER|C10306_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10306_02 - Marchex Inc.|| RSER|C60228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60228_01 - Projexia|| RSER|C60229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60229_01 - Milestone Group PTY LTD|| RSER|C60230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60230_01 - OpenPeak Inc.|| RSER|C60232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60232_01 - Advantage Maintenance|| RSER|C60233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60233_01 - Agilix Labs, Inc|| RSER|C60313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60313_01 - Orsyp|| RSER|C60314_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60314_03 - Pitney Bowes of Canada Ltd.|| RSER|C60314_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60314_04 - PITNEY BOWES LTD|| RSER|C60315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60315_01 - GDG Informatique et Gestion|| RSER|C60322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60322_01 - Alliance Data Systems|| RSER|C60332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60332_01 - LOGICA TI PORTUGAL, S.A.|| RSER|C70559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70559_01 - CONSTRUCTORA ANDRADE GUTIERREZ S.A. - SKANSKA S.A. - UTE|| RSER|C70562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70562_01 - E-Logos|| RSER|C70584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70584_01 - Sacyr Chile S.A.|| RSER|C70584_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70584_02 - Sacyr Chile S.A.|| RSER|C70607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70607_01 - SOFTLINE INTERNATIONAL PERU SAC|| RSER|C70659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70659_01 - Evenex|| RSER|C70662_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70662_01 - I/S Amagerforbrænding|| RSER|C80155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80155_01 - Cofely Ltd|| RSER|C80160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80160_01 - ESB NATIONAL GRID|| RSER|C80164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80164_01 - MAGNOX ELECTRIC PLC|| RSER|C80166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80166_01 - MORRISON|| RSER|C80198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80198_01 - PIERRE MANAGEMENT CONSULTANCY|| RSER|C80204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80204_01 - Price Waterhouse Coopers|| RSER|C80205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80205_01 - Jones Lang Lasalle Resources|| RSER|C80206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80206_01 - INGEUS UK LTD.|| RSER|C80213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80213_01 - Logica|| RSER|C80220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80220_01 - Rockspring HBOS FSPS Holdings (Holland) B.V.|| RSER|C80223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80223_01 - Produban Servicios Informàticos Generales S.L.|| RSER|C80239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80239_01 - EFLUID SAS|| RSER|C80239_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80239_03 - EFLUID SAS|| RSER|C80242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80242_01 - Corsec Security Inc|| RSER|C80243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80243_01 - TEB Edukacja sp. z o.o.|| RSER|C80248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80248_01 - CISCO SYSTEMS INC (2380434)|| RSER|C80249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80249_01 - IPALCO Enterprises, Inc.|| RSER|C80249_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80249_02 - - IPALCO Enterprises, Inc.|| RSER|C80249_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80249_03 - IPALCO Enterprises, Inc.|| RSER|C80251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80251_01 - ARM Limited|| RSER|C70347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70347_01 - Forsyning Helsingør A/S|| RSER|C70353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70353_01 - GITP|| RSER|C70361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70361_01 - Hallingdal Kraftnett As|| RSER|C70364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70364_01 - HEF Himmerlands Elforsyning A.m.b.a.|| RSER|C70375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70375_01 - Infodata|| RSER|C70379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70379_01 - Ista|| RSER|C70381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70381_01 - J & P RICHARDSON INDUSTRIES PTY LTD|| RSER|C70383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70383_01 - JC DECAUX|| RSER|C70383_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70383_03 - JC DECAUX|| RSER|C70383_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70383_04 - JC DECAUX|| RSER|C70383_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70383_05 - JC DECAUX|| RSER|C70383_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70383_06 - JC DECAUX|| RSER|C70383_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70383_11 - JC DECAUX|| RSER|C70388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70388_01 - LAGARDERE|| RSER|C70388_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70388_02 - LAGARDERE|| RSER|C70388_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70388_03 - LAGARDERE|| RSER|C70388_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70388_04 - LAGARDERE|| RSER|C70388_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70388_05 - LAGARDERE|| RSER|C70388_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70388_06 - LAGARDERE|| RSER|C70388_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70388_10 - LAGARDERE|| RSER|C70393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70393_01 - Logica|| RSER|C70407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70407_01 - MISC (NON DEBTOR)|| RSER|C70445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70445_01 - Poland (Logica Krakow)|| RSER|C70463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70463_01 - Sanoma Oyj|| RSER|C70464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70464_01 - SAP|| RSER|C70470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70470_01 - SEAS-NVE Holding A/S|| RSER|C70477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70477_01 - SPARQ SOLUTIONS PTY LTD|| RSER|C70480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70480_01 - Stadtwerke|| RSER|C70485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70485_01 - Svenska UMTS Nat|| RSER|C70485_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70485_02 - Svenska UMTS Nat|| RSER|C70502_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70502_01 - TELVENT AUSTRALIA PTY LTD|| RSER|C70519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70519_01 - DIN Forsyning A/S|| RSER|C70525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70525_01 - Vestforbrænding I/S|| RSER|C70536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70536_01 - WATTERS ELECTRICAL (AUST) PTY LTD|| RSER|C70541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70541_01 - 1&1|| RSER|C70545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70545_01 - Kluwer|| RSER|C80829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80829_01 - GUIDERA O'CONNOR PTY LTD|| RSER|C80830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80830_01 - DATACOM SYSTEMS SA PTY LTD|| RSER|C80831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80831_01 - SEMF PTY LTD|| RSER|C80835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80835_01 - Betfair Ltd (IS)|| RSER|C80837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80837_01 - Cognizant|| RSER|C80838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80838_01 - Countrywide plc|| RSER|C80846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80846_01 - Mars Information Services|| RSER|C80852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80852_01 - URS Infrastructure & Environment UK Limi|| RSER|C80903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80903_01 - Advanced Personnel Management|| RSER|C80927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80927_01 - CIFAS|| RSER|C80929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80929_01 - CLS SERVICES LTD|| RSER|C80976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80976_01 - Red River|| RSER|C81008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81008_01 - PHOENIX IT SERVICES|| RSER|C81017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81017_01 - COLLABRO|| RSER|C81021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81021_01 - LOGIC|| RSER|C81025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81025_01 - SITI Ltd (UK)|| RSER|C81147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81147_01 - Adesso Project Management Inc.|| RSER|C81148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81148_01 - Tech Data GmbH & Co. OHG|| RSER|C81159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81159_01 - Independent/Other|| RSER|C80265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80265_01 - Cure|| RSER|C80268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80268_01 - IW Maintenance|| RSER|C80269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80269_01 - Kinsale|| RSER|C80274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80274_01 - Universal|| RSER|C80275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80275_01 - WASA|| RSER|C80276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80276_01 - CAVALIA INTERNATIONAL ENTERTAINMENT LLC|| RSER|C80278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80278_01 - Association medicale du Quebec (AMQ)|| RSER|C80361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80361_01 - Red River|| RSER|C80378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80378_01 - PARTNERS GLOBAL Corporate Real Estate|| RSER|C80385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80385_01 - BALFOUR BEATTY WORKPLACE LTD|| RSER|C80404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80404_01 - AMETIC|| RSER|C80405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80405_01 - Nutanix, Inc.|| RSER|C80406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80406_01 - Agencia de Informática y Comunicaciones CM|| RSER|C80412_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80412_01 - RANDSTAD España S.L.U|| RSER|C80413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80413_01 - Gestion Bédard Côté inc.|| RSER|C80417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80417_01 - Tragsa|| RSER|C80418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80418_01 - Tragsatec SA|| RSER|C80421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80421_01 - PATENTES TALGO, S.L.|| RSER|C80459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80459_01 - ELOGOS SL|| RSER|C80476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80476_01 - APSM|| RSER|C80480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80480_01 - BYTE COMPUTER S.A.|| RSER|C80487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80487_01 - DUMMY - Contingências|| RSER|C80490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80490_01 - ACS|| RSER|C80492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80492_01 - Agman_Holdings|| RSER|C80497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80497_01 - Avis_Budget|| RSER|C80499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80499_01 - BAM_Construct|| RSER|C80511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80511_01 - Canonical|| RSER|C80513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80513_01 - CB&I|| RSER|C80519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80519_01 - Clyde_&_Co|| RSER|C80542_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80542_01 - Hachette|| RSER|C80544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80544_01 - Herbert_Smith|| RSER|C80546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80546_01 - Hoseasons|| RSER|C80550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80550_01 - Kew_Gardens|| RSER|C80552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80552_01 - Konami|| RSER|C80556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80556_01 - Linklaters|| RSER|C80563_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80563_01 - MECM|| RSER|C80579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80579_01 - Park_Resorts|| RSER|C80580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80580_01 - Pikes_Peak|| RSER|C80581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80581_01 - Pitney_Bowes|| RSER|C80612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80612_01 - Balfour_Beatty|| RSER|C80615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80615_01 - Betfair|| RSER|C80628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80628_01 - Hyphen|| RSER|C80629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80629_01 - Jones_Lang_Lasalle|| RSER|C80640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80640_01 - Euromoney Institutional Investor PLC|| RSER|C80641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80641_01 - Mxi Technologies|| RSER|C80643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80643_01 - CAG Alliance|| RSER|C80693_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80693_01 - QA Consultants|| RSER|C80718_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80718_01 - IT-arkitekterna i Sverige AB|| RSER|C80729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80729_01 - World Vision Canada|| RSER|C80735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80735_01 - CASSIDIAN SOLUTIONS SA|| RSER|C80742_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80742_01 - La Fondation Tremblant|| RSER|C80747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80747_01 - CESMA, S.A|| RSER|C80749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80749_01 - TECNOLOGIA Y GESTION EDUCATIVA, S.L.U.|| RSER|C80751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80751_01 - HWG Suomi Oy|| RSER|C80753_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80753_01 - HR Access Solutions Spain S.L.|| RSER|C80780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80780_01 - Reliance Protectron Inc|| RSER|C80782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80782_01 - Grupo SM|| RSER|C80792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80792_01 - EULEN Servicios Sociosanitarios S.A.|| RSER|C80807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80807_01 - BYMARO|| RSER|C81166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81166_01 - Arion Orchestre Baroque|| RSER|C81175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81175_01 - 7P Trusted Experts GmbH|| RSER|C81251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81251_01 - Ricoh|| RSER|C81252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81252_01 - INGENIEROS CIVILES Y CONTRATISTAS|| RSER|C81263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81263_01 - Gesfor Chile SA|| RSER|C81281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81281_01 - Sommet international des cooperatives|| RSER|C81291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81291_01 - Deloitte Consulting CVBA Belgium|| RSER|C81299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81299_01 - MicrosoftCanadaCo.|| RSER|C81304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81304_01 - Placements Rythme Inc.|| RSER|C81311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81311_01 - HillwoodDevelopmentCompany,L.L.C.|| RSER|C81323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81323_01 - CaverionOyj|| RSER|C81333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81333_01 - Pirel Inc.|| RSER|C81343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81343_01 - Information Technology Nostrum. S. L|| RSER|C81344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81344_01 - Ibermatica, S.A|| RSER|C81349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81349_01 - Danse Danse|| RSER|C81373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81373_01 - Smals|| RSER|C81382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81382_01 - Barco Visual Solutions|| RSER|C81388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81388_01 - The ADT Corporation|| RSER|C81398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81398_01 - SACYR Vallehermoso S.A.|| RSER|C11055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11055_01 - Bird & Bird LLP|| RSER|C11056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11056_01 - RAC Motoring Services|| RSER|C11058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11058_01 - Grand Council of the Crees|| RSER|C11060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11060_01 - Société SFD (Distributeur de Solutions Communicant|| RSER|C11062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11062_01 - Intuitiv Ltd|| RSER|C11064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11064_01 - Granite Claims Solutions|| RSER|C11065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11065_01 - CELFOCUS SOLUCOES INFORMATICAS SA|| RSER|C11066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11066_01 - Objekt-Kontor IS GmbH & Co. KG|| RSER|C11067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11067_01 - Fundacion Plan Internacional Espana|| RSER|C11070_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11070_01 - Fondation du Centre Hospitalier de l'Univ de Mtl|| RSER|C11074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11074_01 - Healthation|| RSER|C11075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11075_01 - ecx.io germany GmbH|| RSER|C11077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11077_01 - American Petroleum Institute|| RSER|C11078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11078_01 - ActivDox Inc.|| RSER|C11079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11079_01 - Cinsay, Inc.|| RSER|C11080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11080_01 - Clinton Großhandels-GmbH|| RSER|C11082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11082_01 - Ivanhoe Cambridge Inc|| RSER|C11084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11084_01 - tilki.consulting|| RSER|C11085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11085_01 - Trusted Shops GmbH|| RSER|C11086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11086_01 - UNIMALL GmbH|| RSER|C11087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11087_01 - Magento|| RSER|C11088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11088_01 - Robert Ragge GmbH|| RSER|C11089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11089_01 - Connected Life, Inc.|| RSER|C11090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11090_01 - EURO INFORMATION SERVICE COMPTABILITE|| RSER|C11091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11091_01 - Navantis Inc.|| RSER|C11092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11092_01 - Lancope Inc.|| RSER|C11094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11094_01 - Cordelta|| RSER|C11095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11095_01 - CHECKPOINT CANADA INTERNAL|| RSER|C11099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11099_01 - Premier, Inc.|| RSER|C11102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11102_01 - Premiere Global Services, Inc.|| RSER|C11103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11103_01 - GSI International Consulting Group|| RSER|C11105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11105_01 - Reed Pope LLP|| RSER|C11119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11119_01 - European GNSS (Global Navigation Satellite System)|| RSER|C11133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11133_01 - HRS Implementation amortisation|| RSER|C11134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11134_01 - Hy-phen.com(Adecco)|| RSER|C11136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11136_01 - JANET UK|| RSER|C11155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11155_01 - RSA|| RSER|C11165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11165_01 - Taylor Wimpey UK Ltd|| RSER|C11186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11186_01 - GLI Canada|| RSER|C11187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11187_01 - International Federation of Airline Pilots's Assoc|| RSER|C11188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11188_01 - SevOne, Inc|| RSER|C11189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11189_01 - Children's Aid Society of Ottawa|| RSER|C11191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11191_01 - Unitil Corporation|| RSER|C11192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11192_01 - New Hampshire Electric Cooperative, Inc.|| RSER|C11194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11194_01 - Forum Systems, Inc.|| RSER|C19999_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C19999_04 - Other Sub Sector RSER|| RSER|C22303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22303_01 - ASE|| RSER|C22306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22306_01 - Beierholm|| RSER|C22315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22315_01 - Ernst and Young A/S|| RSER|C22322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22322_01 - Jens Frilund|| RSER|C22329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22329_01 - Partner Revision|| RSER|C22334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22334_01 - SDC Udvikling A/S|| RSER|C21945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21945_01 - Arek Oy|| RSER|C21981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21981_01 - CEGEDIM|| RSER|C21993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21993_01 - CIFAS|| RSER|C21996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21996_01 - CLS Services Ltd|| RSER|C21996_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21996_02 - CLS Services Ltd|| RSER|C22027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22027_01 - Euronet|| RSER|C22029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22029_01 - F.S.A.|| RSER|C22048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22048_01 - Grundejernes Investeringsfond|| RSER|C22083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22083_01 - LBS-IT|| RSER|C22108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22108_01 - Onsite support|| RSER|C22135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22135_01 - PwC|| RSER|C22149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22149_01 - S1 BELGIUM|| RSER|C22156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22156_01 - SCH|| RSER|C22170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22170_01 - Strålfors Information Logistics A/S|| RSER|C22173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22173_01 - Svenska Kyrkans Forsakringsforening|| RSER|C22186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22186_01 - Union IT Services|| RSER|C22194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22194_01 - Abdulrahman Saad Al-Rashid / Sons Company Ltd.|| RSER|C31410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31410_01 - ETH|| RSER|C31431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31431_01 - GJU|| RSER|C31457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31457_01 - Infoterra Ltd|| RSER|C31487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31487_01 - Lantmateriet|| RSER|C31493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31493_01 - Logica Norge AS|| RSER|C31493_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31493_02 - Logica Norge AS|| RSER|C31553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31553_01 - NSW BUSINESSLINK PTY LTD(Vendor No. 2017026)|| RSER|C31328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31328_01 - AMS UK LTD|| RSER|C40390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C40390_01 - Det Sunde Køkken|| RSER|C50091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50091_01 - Black and McDonald|| RSER|C31602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31602_01 - SAGEM Monetel|| RSER|C31616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31616_01 - Sjofartsverket|| RSER|C31622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31622_01 - Skolverket|| RSER|C31664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31664_01 - Vasakronan|| RSER|C31691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31691_01 - Telam S.E.|| RSER|C51202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51202_01 - Claes Ohlsson|| RSER|C51208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51208_01 - Compass Group Nordic|| RSER|C51209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51209_01 - Connecting-Expertise|| RSER|C51212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51212_01 - Construction & Real Estat|| RSER|C51214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51214_01 - Copidata|| RSER|C51217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51217_01 - Creuna AS|| RSER|C51219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51219_01 - CSC AUSTRALIA PTY LTD|| RSER|C51230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51230_01 - Den Norske Legeforening|| RSER|C51231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51231_01 - Det Norske Veritas AS|| RSER|C51239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51239_01 - DOWNER EDI SERVICES PTY LTD|| RSER|C51241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51241_01 - dunnhumby Ltd|| RSER|C51253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51253_01 - ENSUL MECI|| RSER|C51262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51262_01 - Filiadata|| RSER|C51265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51265_01 - First Hotels AS|| RSER|C51280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51280_01 - Fritz Hansen A/S|| RSER|C51282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51282_01 - Fugro Norway AS|| RSER|C51288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51288_01 - GF SERVICES COMPANY PTY LIMITED (Vendor No 508737)|| RSER|C51294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51294_01 - Grov`Fin SmbA|| RSER|C51296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51296_01 - Gunnebo|| RSER|C51302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51302_01 - Hollming Oy|| RSER|C51306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51306_01 - Humanetisk Forbund|| RSER|C51310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51310_01 - i2r Øst Aps|| RSER|C51313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51313_01 - IBM MRD|| RSER|C51327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51327_01 - ISS|| RSER|C51328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51328_01 - ISS Palvelut Oy|| RSER|C51337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51337_01 - JM|| RSER|C51347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51347_01 - Kelly|| RSER|C51356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51356_01 - Kloska|| RSER|C51362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51362_01 - L.O.G.I.C.|| RSER|C51365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51365_01 - Ladbrokes|| RSER|C51370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51370_01 - Lassila & Tikanoja Oyj|| RSER|C51375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51375_01 - Lindstrom Oy|| RSER|C51379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51379_01 - Lotus Group|| RSER|C51385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51385_01 - Maintpartner|| RSER|C51386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51386_01 - Malerifakta|| RSER|C51403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51403_01 - Minimani Yhtiot Oy|| RSER|C51417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51417_01 - NCC|| RSER|C51418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51418_01 - NCC Construction Danmark A/S|| RSER|C51439_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51439_01 - On,Line|| RSER|C51440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51440_01 - OPWAY|| RSER|C50425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50425_01 - Morneau Sobecco|| RSER|C50589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50589_01 - SNC Lavalin - Agroalimentaire|| RSER|C50589_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50589_02 - SNC Lavalin - Agroalimentaire|| RSER|C50880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50880_01 - Works Alberta|| RSER|C50922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50922_01 - Demix Construction|| RSER|C50941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50941_01 - Dom Development S.A.|| RSER|C51010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51010_01 - MMM Group Limited|| RSER|C51121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_01 - AMADEUS|| RSER|C51121_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_02 - AMADEUS|| RSER|C51121_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_03 - AMADEUS|| RSER|C51121_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_04 - AMADEUS|| RSER|C51121_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_05 - AMADEUS|| RSER|C51121_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_06 - AMADEUS|| RSER|C51121_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_09 - AMADEUS|| RSER|C51121_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_11 - AMADEUS|| RSER|C51129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51129_01 - APP Corporation Pty Limited|| RSER|C51129_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51129_02 - APP Corporation Pty Limited|| RSER|C51134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51134_01 - ARUP PTY LIMITED|| RSER|C51138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51138_01 - Atea|| RSER|C51139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51139_01 - ATG|| RSER|C51159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51159_01 - BasWare A/S|| RSER|C51160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51160_01 - Bavarian Nordic A/S|| RSER|C51163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51163_01 - BDO AS|| RSER|C51166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51166_01 - Betfair Ltd|| RSER|C51166_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51166_02 - Betfair Ltd (IS)|| RSER|C51171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51171_01 - Bluegarden|| RSER|C51576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51576_01 - Sodexo|| RSER|C51576_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51576_02 - Sodexo|| RSER|C51581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51581_01 - Sonat|| RSER|C51593_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51593_01 - Stiftelsen SINTEF|| RSER|C51598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51598_01 - Suomen Palautuspakkaus Oy|| RSER|C51607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51607_01 - Svevia|| RSER|C51608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51608_01 - SWECO|| RSER|C51615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51615_01 - Taylor Wimpey UK Ltd|| RSER|C51615_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51615_02 - Taylor Wimpey UK Ltd|| RSER|C51615_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51615_03 - Taylor Wimpey UK Ltd|| RSER|C51615_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51615_04 - Taylor Wimpey UK Ltd|| RSER|C51616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51616_01 - TECHNIP UK LIMITED|| RSER|C51617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51617_01 - TECHNOLOGY SERVICES GROUP|| RSER|C51618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51618_01 - Technopolis Oyj|| RSER|C51624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51624_01 - The Law Society|| RSER|C51625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51625_01 - Thon Holding AS|| RSER|C51626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51626_01 - Thon Hotels AS|| RSER|C51636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51636_01 - TOPQUADRANT, INC.|| RSER|C51649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51649_01 - Tryiton Norge AS|| RSER|C51650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51650_01 - TTI Services & Other|| RSER|C51653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51653_01 - UGL ENGINEERING PTY LTD|| RSER|C51660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51660_01 - Veidekke ASA|| RSER|C51661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51661_01 - Veikkaus Oy|| RSER|C51676_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51676_01 - Wincor Nixdorf|| RSER|C51679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51679_01 - YIT Oyj|| RSER|C51684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51684_01 - Aditro Finland Oy|| RSER|C51693_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51693_01 - Facilicom|| RSER|C51712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51712_01 - Carabobo Ingenieria y Construcciones, S.A.|| RSER|C51725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51725_01 - Servicios Compartidos CMPC S.A.|| RSER|C51727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51727_01 - South Coop Corporation|| RSER|C51728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51728_01 - UNION DE CER. PERUAN. BACKUS & JOHNSTON SAA|| RSER|C51837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51837_01 - SP Sveriges Tekniska Forskningsinstitut|| RSER|C51907_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51907_01 - 7N A/S|| RSER|C51908_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51908_01 - 7-Technologies|| RSER|C51912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51912_01 - Aage Damgaard Aps|| RSER|C51922_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51922_01 - Albatros Travel A/S|| RSER|C51924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51924_01 - ALLIANCE+ A/S|| RSER|C51927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51927_01 - Arkil A/S|| RSER|C51928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51928_01 - Ascot Hotel Aps|| RSER|C51931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51931_01 - Autorola System Solutions Aps|| RSER|C51935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51935_01 - BALSLEV|| RSER|C51944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51944_01 - Bianco Norge A/S|| RSER|C51959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51959_01 - Bramidan A/S|| RSER|C51962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51962_01 - Bredana Systemudvikling A/S|| RSER|C51963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51963_01 - Brøndum A/S|| RSER|C51965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51965_01 - Brugerklubben SBSYS|| RSER|C51970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51970_01 - BUPL|| RSER|C51971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51971_01 - Bureau Veritas HSE Denmark A/S|| RSER|C51973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51973_01 - Byggeriets Evaluerings Center|| RSER|C51974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51974_01 - C.C. Contractor A/S|| RSER|C51975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51975_01 - C2IT Business Solutions A/S|| RSER|C51986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51986_01 - CAWO A/S|| RSER|C51989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51989_01 - Center for Ledelse|| RSER|C51990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51990_01 - Centralforeningen for Stampersonel|| RSER|C51995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51995_01 - Columbus NSC A/S|| RSER|C51996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51996_01 - Compass|| RSER|C51997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51997_01 - Compu-Game A/S|| RSER|C52006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52006_01 - Daniit A/S|| RSER|C52010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52010_01 - Dansk Autohjælp A/S|| RSER|C52011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52011_01 - Dansk Indkøb A/S|| RSER|C52012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52012_01 - Dansk Lastbiludlejning A/S|| RSER|C52014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52014_01 - Dansk Røde Kors Asylafdeling|| RSER|C52016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52016_01 - Dansk Standard|| RSER|C52017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52017_01 - Dansk Vikar Rengøring Aps|| RSER|C52018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52018_01 - Danske Fysioterapeuter|| RSER|C52019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52019_01 - Danske Handicaporganisationer|| RSER|C52020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52020_01 - Danske Spil A/S|| RSER|C52023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52023_01 - Datasign.dk|| RSER|C52026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52026_01 - Delta Dansk Elektronik Lys and Akustik|| RSER|C52027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52027_01 - Den Danske Presses Fællesindkøbs-Forening|| RSER|C52028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52028_01 - Den S/I Arbejde Adlers Hus|| RSER|C52029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52029_01 - Den Selvejende Institution Søndervang|| RSER|C52031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52031_01 - Det Danske Kunstindustrimuseum|| RSER|C52032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52032_01 - Devoteam Consulting A/S|| RSER|C52038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52038_01 - E Foqus Danmark A/S|| RSER|C52039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52039_01 - E+N Arkitektur A/S|| RSER|C52042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52042_01 - EDB Gruppen A/S|| RSER|C52043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52043_01 - EDC Gruppen|| RSER|C52049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52049_01 - Eiva A/S|| RSER|C52050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52050_01 - Ejendomsmæglerfirmaet Ege|| RSER|C52052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52052_01 - Elretur|| RSER|C52053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52053_01 - Enemærke and Petersen A/S|| RSER|C52054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52054_01 - E-Nettet A/S|| RSER|C52055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52055_01 - Engsø Gruppen A/S|| RSER|C52056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52056_01 - Eniro Danmark A/S|| RSER|C52057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52057_01 - enVision Reklamebureau A/S|| RSER|C52063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52063_01 - Express A/S|| RSER|C52071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52071_01 - Frese Holding ApS|| RSER|C52073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52073_01 - Fritz Schur Teknik A/S|| RSER|C52077_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52077_01 - Gallup A/S|| RSER|C52080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52080_01 - Geopartner Landinspektørgården A/S|| RSER|C52081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52081_01 - Geoteam A/S|| RSER|C52088_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52088_01 - Grafikom A/S|| RSER|C52091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52091_01 - Grontmij A/S|| RSER|C52093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52093_01 - H. J. Hansen Holding A/S|| RSER|C52098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52098_01 - Hededanmark A/S|| RSER|C52100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52100_01 - Herning Taxa|| RSER|C52103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52103_01 - Hilton Copenhagen Hotel|| RSER|C52105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52105_01 - HK Danmark|| RSER|C52107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52107_01 - Holstebro Arkitektkontor A/S|| RSER|C52108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52108_01 - Homeworks Aps|| RSER|C52113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52113_01 - Ibistic Technologies AS|| RSER|C52114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52114_01 - Ibistic Technologies Denmark A/S|| RSER|C52115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52115_01 - Ignify, Inc|| RSER|C52117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52117_01 - Implement Consulting Group P/S|| RSER|C51459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_01 - OTHERS - PERSONAL SERVICES|| RSER|C51459_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_02 - OTHERS - PERSONAL SERVICES|| RSER|C51459_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_03 - OTHERS - PERSONAL SERVICES|| RSER|C51459_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_04 - OTHERS - PERSONAL SERVICES|| RSER|C51459_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_05 - OTHERS - PERSONAL SERVICES|| RSER|C51459_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_06 - OTHERS - PERSONAL SERVICES|| RSER|C51459_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_11 - OTHERS - PERSONAL SERVICES|| RSER|C51459_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_12 - OTHERS - PERSONAL SERVICES|| RSER|C51462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_01 - OTHERS - TOURISM & LEISURE|| RSER|C51462_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_02 - OTHERS - TOURISM & LEISURE|| RSER|C51462_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_03 - OTHERS - TOURISM & LEISURE|| RSER|C51462_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_04 - OTHERS - TOURISM & LEISURE|| RSER|C51462_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_05 - OTHERS - TOURISM & LEISURE|| RSER|C51462_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_06 - OTHERS - TOURISM & LEISURE|| RSER|C51462_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_07 - OTHERS - TOURISM & LEISURE|| RSER|C51462_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_11 - OTHERS - TOURISM & LEISURE|| RSER|C51462_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51462_12 - OTHERS - TOURISM & LEISURE|| RSER|C51478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51478_01 - PBL Medlemsservice AS|| RSER|C51479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51479_01 - PEAB|| RSER|C51503_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51503_01 - R.A.C.|| RSER|C51507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51507_01 - Ramirent|| RSER|C51508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51508_01 - Ramirent Oyj|| RSER|C51511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51511_01 - REED ELSEVIER AUSTRALIA|| RSER|C51521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51521_01 - Riksbyggen|| RSER|C51525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51525_01 - Rosendahl Design Group A/S|| RSER|C51554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51554_01 - SDC EK FoR|| RSER|C51556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51556_01 - Sector Alarm Holding AS|| RSER|C51557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51557_01 - Securitas|| RSER|C51560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51560_01 - Services|| RSER|C51565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51565_01 - Silta Oy|| RSER|C51566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51566_01 - SINTEF|| RSER|C70249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70249_01 - Arwos Service A/S|| RSER|C70253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70253_01 - AUSTCO POLAR PTY LTD|| RSER|C70255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70255_01 - Axel Springer|| RSER|C70263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70263_01 - Bonnier Koncernen|| RSER|C70268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70268_01 - CAPGEMINI AUSTRALIA PTY LIMITED|| RSER|C70284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70284_01 - Diorh|| RSER|C70289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70289_01 - DOWNER EDI ENGINEERING POWER P/L|| RSER|C70306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70306_01 - EEM|| RSER|C52119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52119_01 - Industriens Uddannelser|| RSER|C52120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52120_01 - Informi Gis A/S|| RSER|C52128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52128_01 - IT Relation|| RSER|C52129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52129_01 - Itella Information AB|| RSER|C52130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52130_01 - J. Lauritzen A/S|| RSER|C52133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52133_01 - Jørgen Kristensen Malerfirma ApS|| RSER|C52143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52143_01 - Københavns Teater|| RSER|C52144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52144_01 - KOORB Consulting Ltd.|| RSER|C52149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52149_01 - Lægemiddelindustriforeningen|| RSER|C52150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52150_01 - Lalandia A/S|| RSER|C52154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52154_01 - LE34 Gruppen Landinspektøraktieselskab|| RSER|C52161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52161_01 - LK Gruppen A/S|| RSER|C52162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52162_01 - LM Information Delivery Danmark A/S|| RSER|C52163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52163_01 - LMK Vej A/S|| RSER|C52164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52164_01 - Logica Sverige AB|| RSER|C52165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52165_01 - Logimatic Holding A/S|| RSER|C52166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52166_01 - Lokaldelen i Sverige AB|| RSER|C52167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52167_01 - Løsning Maskinværksted|| RSER|C52170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52170_01 - Macc Nav Solution ApS|| RSER|C52171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52171_01 - DELTEK DANMARK A/S|| RSER|C52174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52174_01 - MainSoft International A/S|| RSER|C52175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52175_01 - Malernes Andelsforretning|| RSER|C52179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52179_01 - MCB A/S|| RSER|C52182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52182_01 - Microsoft Danmark Aps|| RSER|C52185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52185_01 - Mind4it|| RSER|C52189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52189_01 - Moe and Brødsgaard A/S|| RSER|C52190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52190_01 - Moesgård Museum|| RSER|C52193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52193_01 - naviSYS a/s|| RSER|C52199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52199_01 - Nordic Real Estate Partners ApS|| RSER|C52202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52202_01 - NORRIQ Danmark A/S|| RSER|C52203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52203_01 - Norsøens Forskerpark|| RSER|C52209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52209_01 - Oplevelsesparken a/s|| RSER|C52210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52210_01 - Orbicon A/S|| RSER|C52211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52211_01 - Ørskov Leder- og Organisationsudvikling A/S|| RSER|C52219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52219_01 - Pelican Denmark Holding ApS|| RSER|C52220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52220_01 - Per Aarsleff A/S|| RSER|C52226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52226_01 - Plesner Svane Grønborg|| RSER|C52227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52227_01 - PLH Arkitekter A/S|| RSER|C52232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52232_01 - Quest Sofrware Scandinavian A/S|| RSER|C52237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52237_01 - Rambøll A/S|| RSER|C52238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52238_01 - Randstad vikar|| RSER|C52244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52244_01 - RMB 4 - reklame and Marketing Butikken Aps|| RSER|C52249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52249_01 - S.C.Studio Aps|| RSER|C52253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52253_01 - sbs rådgivning a/s|| RSER|C52254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52254_01 - Scan Jour A/S|| RSER|C52255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52255_01 - ScanConsult IT-Partners ApS|| RSER|C52256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52256_01 - Scandic Hotel A/S|| RSER|C52257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52257_01 - Scandic Hotel AB|| RSER|C52263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52263_01 - Scanpix|| RSER|C52271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52271_01 - Selskabet DGS af 2011 A/S|| RSER|C52280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52280_01 - Sol og Strand Feriehusudlejning A/S|| RSER|C52288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52288_01 - Stenbjerg Ejendomme A/S|| RSER|C52294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52294_01 - Swets Information Services A/S|| RSER|C52296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52296_01 - System Group Scandinavia ApS|| RSER|C52299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52299_01 - Thornico IT A/S|| RSER|C52300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52300_01 - Tia Technology A/S|| RSER|C52302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52302_01 - Tivoli A/S|| RSER|C52303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52303_01 - TK Bygge-Holding A/S|| RSER|C52304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52304_01 - Topsolutions Aps|| RSER|C52312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52312_01 - Union Engineering A/S|| RSER|C52316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52316_01 - Vægtergården ApS|| RSER|C52323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52323_01 - Villa Musica|| RSER|C52326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52326_01 - VRÅ DAMPVASKERI A/S|| RSER|C52328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52328_01 - WBI, s.r.o.|| RSER|C52329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52329_01 - Weinert Holding Aps|| RSER|C52330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52330_01 - Wissenberg A/S|| RSER|C60005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60005_01 - Amvensys Technologies|| RSER|C60148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60148_01 - The Minto Group|| RSER|C60180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60180_01 - Corporacion General de Servicios S.A|| RSER|C60181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60181_01 - COSAPI DATA SA|| RSER|C60189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60189_01 - INVERSIONES CENTENARIO SAA|| RSER|C60194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60194_01 - MICROSOFT PERU S.R.L|| RSER|C60202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60202_01 - PAZ-CENTENARIO-GLOBAL S.A.|| RSER|C60208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60208_01 - VIVA GYM SA|| RSER|C60210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60210_01 - Universal Data Company|| RSER|C60212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60212_01 - Riverbed Technology|| RSER|C60213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60213_01 - The OpenSSL Software Foundation, Inc.|| RSER|C60214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60214_01 - AFORE|| RSER|C60215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60215_01 - Keyrus Canada Inc|| RSER|C60218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60218_01 - Westfield Group|| RSER|C60222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60222_01 - SAGE AUTOMATION PTY LTD|| RSER|C60223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60223_01 - Artech Information Systems LLC|| RSER|C60224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60224_01 - SALMAT IDR PTY LIMITED|| RSER|C60225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60225_01 - Cofomo|| RSER|C10032_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_04 - HP - Hewlett Packard (US)|| RSER|C10927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10927_01 - RCAA - Planifika|| RSER|C10928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10928_01 - Mary Gibson Consulting Inc.|| RSER|C10929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10929_01 - TATA Consultancy Services|| RSER|C10929_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10929_02 - TATA Consultancy Services|| RSER|C10931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10931_01 - Fugro Data Solutions|| RSER|C10936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10936_01 - ExoCube Inc.|| RSER|C10937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10937_01 - Focus Corporation|| RSER|C10940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10940_01 - Ressources Entreprises|| RSER|C10941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10941_01 - NMPP - Nouvelles messageries de la presse parisienne|| RSER|C10942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10942_01 - Sunquest Information Systems Ltd|| RSER|C10943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10943_01 - Domestic and General Services Limited|| RSER|C10944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10944_01 - Chandler and Macleod|| RSER|C10947_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10947_01 - QiPower - Consultoria e Serviços|| RSER|C10948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10948_01 - Softinsa|| RSER|C10949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10949_01 - Blue Coat|| RSER|C10951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10951_01 - Tecnologías de Código Abierto|| RSER|C10952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10952_01 - STAT Imaging Solutions|| RSER|C10953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10953_01 - SRA Information Technology|| RSER|C10957_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10957_01 - Tank|| RSER|C10959_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10959_01 - N. Harris Computer Corp.|| RSER|C10959_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10959_04 - Harris, N. Computer Corporation|| RSER|C10961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10961_01 - Théâtre du Nouveau Monde|| RSER|C10962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10962_01 - Bull (HSM)|| RSER|C10963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10963_01 - Curtiss-Wright Controls|| RSER|C10964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10964_01 - Extreme Networks|| RSER|C10966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10966_01 - Websense Inc.|| RSER|C10967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10967_01 - OSQ - Orchestre symphonique de Québec|| RSER|C10968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10968_01 - Nurun Inc.|| RSER|C10972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10972_01 - Netrada Management|| RSER|C10973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10973_01 - Certes Networks|| RSER|C10974_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10974_01 - Progress|| RSER|C10975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10975_01 - SAS Institute|| RSER|C10979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10979_01 - KPMG|| RSER|C10979_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10979_02 - KPMG|| RSER|C10980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10980_01 - Bluberi|| RSER|C10981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10981_01 - Canadian Cancer Society of Saskatchewan|| RSER|C10983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10983_01 - AIPSO|| RSER|C10986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10986_01 - APM|| RSER|C10986_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10986_02 - APM|| RSER|C10987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10987_01 - Ciena|| RSER|C10988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10988_01 - LogLogic Inc.|| RSER|C10989_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10989_01 - Société Conseil Lambda|| RSER|C10990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10990_01 - Software AG|| RSER|C10992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10992_01 - Global Village Consulting Inc.|| RSER|C10992_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10992_02 - Global Village Consulting Inc.|| RSER|C10993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10993_01 - iNext SA|| RSER|C10995_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10995_01 - CSA Group|| RSER|C10996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10996_01 - Theilgaard Mortensen|| RSER|C10998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10998_01 - Verdasys|| RSER|C11001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11001_01 - Heiler Software AG|| RSER|C11005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11005_01 - GIE ALCARA|| RSER|C11009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11009_01 - Grant Thornton LLP|| RSER|C11009_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11009_02 - RCGT - Raymond Chabot Grant Thornton|| RSER|C11010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11010_01 - MSC CORP|| RSER|C11011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11011_01 - Countrywide Plc|| RSER|C11011_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11011_02 - Countrywide Plc|| RSER|C11011_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11011_03 - Countrywide Plc|| RSER|C11012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11012_01 - Provenir Inc.|| RSER|C11012_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11012_02 - Provenir Inc.|| RSER|C11012_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11012_03 - Provenir Inc.|| RSER|C11013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11013_01 - Neckermann.de GmbH|| RSER|C11015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11015_01 - MediaanABS Deutschland|| RSER|C11018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11018_01 - Palais des congres de Montreal|| RSER|C11019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11019_01 - Roche Ltée, Groupe-conseil|| RSER|C11022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11022_01 - Diversinet Corp.|| RSER|C11023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11023_01 - Carlson Wagonlit|| RSER|C11024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11024_01 - John Howard Society of SSM|| RSER|C11025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11025_01 - Marathon de Quebec|| RSER|C11029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11029_01 - Safenet|| RSER|C11031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11031_01 - Eco Entreprises Quebec|| RSER|C11033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11033_01 - Carilion Clinic|| RSER|C11035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11035_01 - CapTech Ventures Inc.|| RSER|C11036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11036_01 - CMAS - Systems Consultants|| RSER|C11037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11037_01 - Centro De Innovacion de Infraestructuras|| RSER|C11038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11038_01 - E.C.I.G.A.|| RSER|C11041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11041_01 - CyberSearch Ltd|| RSER|C11042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11042_01 - SecureKey Technologies Inc|| RSER|C11043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11043_01 - Gamerizon Studio Inc.|| RSER|C11044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11044_01 - Lansdowne Technologies Inc.|| RSER|C11045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11045_01 - Fortinet|| RSER|C11046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11046_01 - Avanade Australia Pty Limited|| RSER|C11047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11047_01 - Totemo AG|| RSER|C11048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11048_01 - Legal Services Society|| RSER|C11050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11050_01 - Heenan Blaikie|| RSER|C11051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11051_01 - Proofpoint inc.|| RSER|C11052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11052_01 - PARC Systems Inc.|| RSER|C11053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11053_01 - Ashurst Australia|| RSER|C81223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81223_01 - Steria Benelux SA Belgium|| RSER|C81223_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81223_02 - Steria Benelux SA Belgium|| RSER|C70671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70671_01 - Moyersoen|| RSER|C81464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81464_01 - Corporacion General de Servicios S.A.|| RSER|C81488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81488_01 - Marathon Petroleum Corporation|| RSER|C81493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81493_01 - MUCHOVIAJE|| RSER|C81504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81504_01 - Capital Region Prostate Centre, The|| RSER|C80281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80281_01 - Hi-Flyer Food Canada Inc.|| RSER|C81514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81514_01 - Fondation du Grand Montreal, La|| RSER|C81522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81522_01 - Savantage Solutions, Inc.|| RSER|C81523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81523_01 - Saskatchewan Cancer Agency|| RSER|C81531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81531_01 - Preservation Development Partners|| RSER|C81538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81538_01 - Arbutus Solutions Limited|| RSER|C21061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21061_01 - Micro Focus|| RSER|C21133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21133_01 - Extelia|| RSER|C21880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21880_01 - Provenir Inc.|| RSER|C21880_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21880_02 - Provenir Inc.|| RSER|C21880_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21880_03 - Provenir Inc.|| RSER|C30943_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C30943_01 - Eco Entreprises Quebec|| RSER|C51346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51346_01 - KATAHIRA|| RSER|C51762_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51762_01 - Construction & Real Estate|| RSER|C51780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51780_01 - JM|| RSER|C51804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51804_01 - Ramirent|| RSER|C51806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51806_01 - Riksbyggen|| RSER|C50004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50004_01 - Abattoir Saint-Germain|| RSER|C50229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50229_01 - EllisDon|| RSER|C50394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50394_01 - Manpower Services Ltd|| RSER|C50535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50535_01 - Rebuts Solide Canadiens|| RSER|C50596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50596_01 - Soprema Inc.|| RSER|C50611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50611_01 - Structure Metropolitain|| RSER|C50618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50618_01 - T.B.S. Construction|| RSER|C50955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50955_01 - 3E Company|| RSER|C50958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C50958_01 - Da Vinci|| RSER|C51153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51153_01 - Ayala Land|| RSER|C51216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51216_01 - Cramo|| RSER|C60204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60204_01 - SERVICE GENERAL GROUP S.A.C|| RSER|C60207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60207_01 - Viva GMV S.A.|| RSER|C60247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60247_01 - Lantmateriet|| RSER|C60257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60257_01 - Sjofartsverket|| RSER|C60259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60259_01 - Skolverket|| RSER|C60265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60265_01 - Trygghetsradet|| RSER|C60267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60267_01 - Vasakronan|| RSER|C60330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60330_01 - Raymond Chabot Grant Thornton s.e.n.c.r.l.|| RSER|C60333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60333_01 - CMS|| RSER|C70238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70238_01 - ADVALTIS|| RSER|C70242_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70242_01 - Aker Kvaerner|| RSER|C70391_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70391_01 - LINFOX AUSTRALIA PTY LTD (Vendor No. 30532791)|| RSER|C80287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80287_01 - S.i. Systems Partnership|| RSER|C80290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80290_01 - Trade Service Management|| RSER|C80320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80320_01 - MSS - Shared (Dummy)|| RSER|C80326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80326_01 - GRAND CENTRAL SOUNDS STUDIOS|| RSER|C80326_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80326_02 - GRAND CENTRAL SOUNDS STUDIOS|| RSER|C80326_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80326_03 - GRAND CENTRAL SOUNDS STUDIOS|| RSER|C80328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80328_01 - Hillgate Travel Limited|| RSER|C80328_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80328_02 - Hillgate Travel Limited|| RSER|C80328_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80328_03 - Hillgate Travel Limited|| RSER|C80337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80337_01 - Federal Cloud|| RSER|C80342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80342_01 - SERVICES DE CONFORMITES EN SOUSCRIPTION|| RSER|C80354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80354_01 - GREMIO ARTESANOS CONFITEROS P. ASTURIAS|| RSER|C80423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80423_01 - MORSON PROJECTS LIMITED|| RSER|C80423_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80423_02 - MORSON PROJECTS LIMITED|| RSER|C80426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80426_01 - Rapleys Limited Liability Partnership|| RSER|C80426_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80426_02 - Rapleys Limited Liability Partnership|| RSER|C80426_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80426_03 - Rapleys Limited Liability Partnership|| RSER|C80436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80436_01 - UKA ATHELETICS|| RSER|C80437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80437_01 - LAMBERT SMITH HAMPTON|| RSER|C80437_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80437_02 - LAMBERT SMITH HAMPTON|| RSER|C80437_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80437_03 - LAMBERT SMITH HAMPTON|| RSER|C80439_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80439_01 - Global D8 Ltd|| RSER|C80441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80441_01 - WW (UK) Limited|| RSER|C80442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80442_01 - Speymill Contracts Ltd|| RSER|C80445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80445_01 - SuitCASE|| RSER|C80446_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80446_01 - DTZ|| RSER|C80481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80481_01 - ASPLAN VIAK AS|| RSER|C80635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80635_01 - PWC|| RSER|C80706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80706_01 - Professional Shredding Corporation|| RSER|C80712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80712_01 - Professional Shredding Corporation|| RSER|C80727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80727_01 - Periscope Holdings|| RSER|C80737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80737_01 - Brovada Technologies Inc|| RSER|C80784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80784_01 - LOGICA DEUTSCHLAND GmbH & Co.KG|| RSER|C80789_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80789_01 - LOGICA SUOMI OY|| RSER|C80797_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80797_01 - Guoman Hotels Ltd|| RSER|C80797_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80797_02 - Guoman Hotels Ltd|| RSER|C80811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80811_01 - ThirdQuarter|| RSER|C80841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80841_01 - Hays AG|| RSER|C80845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80845_01 - JS INFORMATION SYSTEMS Ltd|| RSER|C80923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80923_01 - CARBON ASSOCIATES LIMITED|| RSER|C80924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80924_01 - Carbon Auditors|| RSER|C80977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80977_01 - Robert Walters Operations Limited|| RSER|C81058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81058_01 - Specialist Computer Centres|| RSER|C81064_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81064_01 - Acorn Training Ltd|| RSER|C81075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81075_01 - Capgemini Sud SAS|| RSER|C81114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81114_01 - IBM UK LTD|| RSER|C81139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81139_01 - Skysoft Portugal S.A|| RSER|C81185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81185_01 - AGEFOS|| RSER|C81358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81358_01 - Northgate Info Solutions UK Ltd|| RSER|C81416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81416_01 - Spur Information Solutions Limited|| RSER|C81418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81418_01 - HWG Denmark|| RSER|C10352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10352_01 - OnX Enterprise Solutions Inc.|| RSER|C10353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10353_01 - OCAQ - Ordre des comptables agrees du Quebec|| RSER|C10353_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10353_02 - OCAQ - Ordre des comptables agrees du Quebec|| RSER|C10354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10354_01 - OIQ - Ordre des ingenieurs du Quebec|| RSER|C10355_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10355_01 - Ordre professionnel|| RSER|C10360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10360_01 - People Movers|| RSER|C10362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10362_01 - Philippe Gosselin et Associés Ltée|| RSER|C10365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10365_01 - Planet Personnel Agency Inc.|| RSER|C10373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10373_01 - ProDinning.com|| RSER|C10374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10374_01 - Productions Tourmotion Inc.|| RSER|C10377_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10377_01 - Proprietes Terra Incognita Inc.|| RSER|C10387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10387_01 - QVC-Inscript|| RSER|C10390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10390_01 - R. Cope and Associates Inc.|| RSER|C10396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10396_01 - Re/Max de Francheville|| RSER|C10402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10402_01 - Robert et Robert (1978) Inc.|| RSER|C10409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10409_01 - Salad Express|| RSER|C10411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10411_01 - Sapphire Technologies|| RSER|C10421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10421_01 - SFE Global|| RSER|C10423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10423_01 - Shopmedia Inc.|| RSER|C10424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10424_01 - S.I. Systems Inc.|| RSER|C10425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10425_01 - Sierra Systems Group Inc.|| RSER|C10427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10427_01 - Sinapse|| RSER|C10432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10432_01 - SVPI - Social Venture Partners International|| RSER|C10434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10434_01 - Societe de la Place des Arts de Montreal|| RSER|C10437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10437_01 - Solutions West Inc.|| RSER|C10437_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10437_02 - Solutions West Inc.|| RSER|C10438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10438_01 - Soroc Technology Inc.|| RSER|C10440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10440_01 - SPACQ - Societe prof. des auteurs et des compositeurs du Quebec|| RSER|C10442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10442_01 - Spherion Technology|| RSER|C10445_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10445_02 - Specialistes YG Ltee|| RSER|C10451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10451_01 - Stoneham Mountain Resort|| RSER|C10453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10453_01 - Strategic Maintenance Solutions Inc.|| RSER|C10456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10456_01 - Summum Design Inc.|| RSER|C10457_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10457_01 - Systems Engineering Services Corporation|| RSER|C10458_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10458_02 - Systems Design Inc.|| RSER|C10460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10460_01 - Talentworks Inc.|| RSER|C10461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10461_01 - Technology Evaluation Centers Inc.|| RSER|C10464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10464_01 - TEKsystems|| RSER|C10465_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10465_01 - TES Contract Services|| RSER|C10468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10468_01 - CICA - Canadian Institute of Chartered Accountants|| RSER|C10472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10472_01 - Thomson Canada Limited|| RSER|C10479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10479_01 - Trilogy Technical Services|| RSER|C10482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10482_01 - TRM Technologies Inc.|| RSER|C10484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10484_01 - Union des citoyens et citoyennes|| RSER|C10487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10487_01 - United Way of Calgary and Area|| RSER|C10496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10496_01 - Vedior North America|| RSER|C10499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10499_01 - Veritude|| RSER|C10504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10504_01 - Volunteer Calgary|| RSER|C10517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10517_01 - Yahoo! Inc.|| RSER|C10517_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10517_02 - Yahoo! Inc.|| RSER|C10523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10523_01 - Compagnies du groupe Data|| RSER|C10525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10525_01 - Gatek International|| RSER|C10539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10539_01 - Seven Consulting Ltd|| RSER|C10541_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10541_01 - Tarcredit|| RSER|C10543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10543_01 - Software de Base|| RSER|C10549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10549_01 - NT Consulting Inc.|| RSER|C10555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10555_01 - Modis International Ltd|| RSER|C10566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10566_01 - Support environnement application Oracle|| RSER|C10572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10572_01 - Manoir Rouville-Campbell|| RSER|C10573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10573_01 - Archambault - Magasin Virtuel|| RSER|C10577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10577_01 - Ariel Research Corporation|| RSER|C10582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10582_01 - CU-Connection Limited|| RSER|C10588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10588_01 - Accilia|| RSER|C10590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10590_01 - Advanceit|| RSER|C10606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10606_01 - Maltem|| RSER|C10607_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10607_01 - Mazars Group|| RSER|C10610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10610_01 - Plaut|| RSER|C10613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10613_01 - SAP France|| RSER|C10617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10617_01 - Technilog|| RSER|C10620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10620_01 - Unilog|| RSER|C10627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10627_01 - Con.nexo|| RSER|C10631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10631_01 - Topalis|| RSER|C10645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10645_01 - Transiciel|| RSER|C10648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10648_01 - TimSpirit|| RSER|C10650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10650_01 - Osiatis|| RSER|C10654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10654_01 - VRSI Consultation|| RSER|C10655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10655_01 - Coradix Technology Consulting Ltd|| RSER|C10656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10656_01 - Bricsnet FM America Inc.|| RSER|C10658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10658_01 - APCM - Association des professionnels de la chanson et de la musique|| RSER|C10659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10659_01 - SDCC - Sustainable Development Context Climate Change|| RSER|C10663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10663_01 - Coventry Management Inc.|| RSER|C10667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10667_01 - NEC Corporation|| RSER|C10668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10668_01 - Orion Solutions|| RSER|C10673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10673_01 - Les violons du Roy|| RSER|C10674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10674_01 - Agile 1|| RSER|C10674_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10674_02 - Agile 1|| RSER|C10680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10680_01 - Hampshire Hotels and Resorts|| RSER|C10686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10686_01 - Trade Services Management|| RSER|C10694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10694_01 - webMethods Netherlands|| RSER|C10711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10711_01 - CIA - Conseillers en informatique d'affaires|| RSER|C10711_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10711_02 - CIA - Conseillers en informatique d'affaires|| RSER|C10711_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10711_03 - CIA - Conseillers en informatique d'affaires|| RSER|C10715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10715_01 - Immeuble Populaire de Québec Inc.|| RSER|C10722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10722_01 - CIGM - Chambre immobiliere du Grand Montreal|| RSER|C10723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10723_01 - Gestion CIL Management|| RSER|C10726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10726_01 - Info-Tech Inc.|| RSER|C10730_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10730_01 - eLogic Group|| RSER|C10733_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10733_01 - Visicom Media|| RSER|C10741_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10741_01 - IBI Group|| RSER|C10743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10743_01 - AGI Services Conseil|| RSER|C10746_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10746_01 - Partagec Inc.|| RSER|C10748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10748_01 - Habitat for Humanity International|| RSER|C10750_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10750_01 - CPA - Comite paritaire de l'industrie automobile|| RSER|C10753_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10753_01 - Lavalife Inc.|| RSER|C10763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10763_01 - ST Groupe|| RSER|C10764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10764_01 - Transitio Inc.|| RSER|C10766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10766_01 - Tact Conseil|| RSER|C10771_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10771_01 - Colas Canada Inc.|| RSER|C22107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22107_01 - OM|| RSER|C51895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51895_01 - NCC|| RSER|C51897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51897_01 - PEAB|| RSER|C52194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52194_01 - NCC Danmark A/S|| RSER|C70561_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70561_01 - Ebco S.A.|| RSER|C70585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70585_01 - Skanska Chile S.A|| RSER|C80431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80431_01 - KELLOGG BROWN & ROOT LIMITED|| RSER|C80431_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80431_02 - KELLOGG BROWN & ROOT LIMITED|| RSER|C80431_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80431_03 - KELLOGG BROWN & ROOT LIMITED|| RSER|C80432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80432_01 - LAING O'ROURKE|| RSER|C80796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80796_01 - WATES INTERIORS LTD|| RSER|C80796_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80796_02 - WATES INTERIORS LTD|| RSER|C80798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80798_01 - CDM Smith|| RSER|C81043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81043_01 - INTERSERVE FM LTD|| RSER|C81319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81319_01 - CaverionNEOy|| RSER|C81320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81320_01 - CaverionNEOy|| RSER|C81321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81321_01 - CaverionDanmarkA/S|| RSER|C81322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81322_01 - CaverionDanmarkA/S|| RSER|C81324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81324_01 - CaverionIndustriaOy|| RSER|C81325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81325_01 - CaverionOyj|| RSER|C81326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81326_01 - CaverionIndustriaOy|| RSER|C10009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10009_01 - ACFAS - Association francophone pour le savoir|| RSER|C10010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10010_01 - Acrobat Results Marketing Inc.|| RSER|C10016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10016_01 - AGF Management Limited|| RSER|C10019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10019_01 - Ajilon Consulting|| RSER|C10019_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10019_02 - Ajilon Consulting|| RSER|C10023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10023_01 - Alcea Technologies Inc.|| RSER|C10026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10026_01 - Alliance Web-Commerce|| RSER|C10028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10028_01 - Altek Information Technology|| RSER|C10031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10031_01 - Manheim Auctions Inc.|| RSER|C10031_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10031_03 - Manheim Auctions Inc.|| RSER|C10034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10034_01 - Amerispa|| RSER|C10037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10037_01 - Apex Mountain Resort|| RSER|C10038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10038_01 - Applied Accoustics Systems DVM|| RSER|C10040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10040_01 - Groupe Archambault|| RSER|C10041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10041_01 - Armatures DNS Inc.|| RSER|C10043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10043_01 - Artitalia Group Inc.|| RSER|C10045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10045_01 - AERDPQ - Ass. des etablissements de readapt. en deficience phys.|| RSER|C10046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10046_01 - Asset Computer Personnel|| RSER|C10049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10049_01 - Atelier Abaco Inc.|| RSER|C10055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10055_01 - Axia|| RSER|C10059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10059_01 - Barreau du Quebec|| RSER|C10060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10060_01 - BC - Association of Aboriginal Friendship Centres (BCAAFC)|| RSER|C10067_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10067_01 - Bluberi Systems Inc.|| RSER|C10073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10073_01 - Bradson Technology Professionals|| RSER|C10074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10074_01 - Brainhunter Inc.|| RSER|C10080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10080_01 - BMR Builder's Warehouse|| RSER|C10087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10087_01 - Marcil Centre de rénovation|| RSER|C10092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10092_01 - Capilano Computing Systems Ltd|| RSER|C10094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10094_01 - CBRE - CB Richard Ellis|| RSER|C10095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10095_01 - CDI Professional Services Ltd|| RSER|C10096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10096_01 - CICA - Canadian Institute of Chartered Accountants|| RSER|C10102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10102_01 - CERIU - Centre d'expertise et de rech. en infrastr. urbaines|| RSER|C10105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10105_01 - Canadian Information Processing Society (CIPS) Queen City Section|| RSER|C10119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10119_01 - Concord Computing Corporation|| RSER|C10120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10120_01 - Congrégation de Notre-Dame du Québec|| RSER|C10121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10121_01 - CEI - Congres Eucharistique International 2008|| RSER|C10124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10124_01 - CMC - Constructions de mausolées Carrier Inc.|| RSER|C10126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10126_01 - Corporation episcopale Catholique Romaine|| RSER|C10135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10135_01 - Cranberry Golf Resort|| RSER|C10136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10136_01 - CRIM Formation|| RSER|C10139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10139_01 - Cross Border Nurses|| RSER|C10142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10142_01 - Cyber-Cyclope Ltee|| RSER|C10148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10148_01 - Davies Ward Phillips and Vineberg|| RSER|C10166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10166_01 - Dynamic Staffing Inc.|| RSER|C10182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10182_01 - ETP Solutions Inc.|| RSER|C10191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10191_01 - Festival Juste Pour Rire|| RSER|C10192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10192_01 - Fidelisoft Inc.|| RSER|C10195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10195_01 - Fondation du maire de Montreal pour la jeunesse|| RSER|C10196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10196_01 - ITHQ - Fondation de l'ITHQ|| RSER|C10198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10198_01 - FQC - Fondation quebecoise du cancer|| RSER|C10207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10207_01 - Gestion Denis Plante Inc.|| RSER|C10209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10209_01 - Gestion produits aux entreprises|| RSER|C10215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10215_01 - Groom and Associates|| RSER|C10217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10217_01 - Groupe Conseil OSI Inc.|| RSER|C10223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10223_01 - Groupe LGS Inc.|| RSER|C10223_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10223_02 - Groupe LGS Inc.|| RSER|C10223_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10223_03 - Groupe LGS Inc.|| RSER|C10227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10227_01 - GSF Impeka Inc.|| RSER|C10229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10229_01 - Handicap International|| RSER|C10236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10236_01 - Holiday Inn|| RSER|C10238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10238_01 - Hotel Maritime|| RSER|C10239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10239_01 - 14C Information Technology Consultant|| RSER|C10244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10244_01 - Inco Technical Services Ltd|| RSER|C10246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10246_01 - Ingenium Group Inc.|| RSER|C10249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10249_01 - ICM - Institut du cancer de Montreal|| RSER|C10252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10252_01 - Interpro Consultants|| RSER|C10253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10253_01 - Inventarium|| RSER|C10261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10261_01 - JT Packard and Associates Inc.|| RSER|C10262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10262_01 - Jump on Block Inc.|| RSER|C10264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10264_01 - Keith Bagg Staffing Resources|| RSER|C10272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10272_01 - La fabrique de la paroisse Notre-Dame|| RSER|C10275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10275_01 - Laliberté et Associés Inc.|| RSER|C10276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10276_01 - Lamda|| RSER|C10281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10281_01 - Le Droit|| RSER|C10286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10286_01 - Les pros de la photo|| RSER|C10305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10305_01 - ManPower Inc.|| RSER|C10308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10308_01 - MGL - Mascon Global Limited|| RSER|C10309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10309_01 - Le Massif|| RSER|C10325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10325_01 - Momentum Advanced Solutions Inc.|| RSER|C10326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10326_01 - Monster.com|| RSER|C10327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10327_01 - Mont Saint-Anne|| RSER|C10330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10330_01 - Multi-Fonctions|| RSER|C10331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10331_01 - Multi-Portions Inc.|| RSER|C10332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10332_01 - MVP Consulting Plus Inc.|| RSER|C10347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10347_01 - Notaire Direct|| RSER|C10773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10773_01 - VR Conseil|| RSER|C10774_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10774_01 - AvNet Technology Solutions|| RSER|C10775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10775_01 - McCarthy Tétrault|| RSER|C10776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10776_01 - ESSG - Enterprise Systems and Solutions Group|| RSER|C10778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10778_01 - Warren Shepell|| RSER|C10787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10787_01 - Plante and Moran|| RSER|C10790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10790_01 - Atlantic Technologies|| RSER|C10792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10792_01 - Extra Multi-Ressources|| RSER|C10800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10800_01 - Affinion Group|| RSER|C10807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10807_01 - Eveho Conseil|| RSER|C10809_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10809_01 - Technologies Yttrium|| RSER|C10810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10810_01 - Sarbakan|| RSER|C10814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10814_01 - editions Blainville Deux-Montagnes|| RSER|C10819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10819_01 - Genivar|| RSER|C10840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10840_01 - Data First|| RSER|C10842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10842_01 - Fafiec|| RSER|C10842_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10842_02 - Fafiec|| RSER|C10842_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10842_03 - Fafiec|| RSER|C10842_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10842_04 - Fafiec|| RSER|C10844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10844_01 - MI6|| RSER|C10845_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10845_01 - Microtime Inc.|| RSER|C10846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10846_01 - PMS Pireteck|| RSER|C10848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10848_01 - Proxiel|| RSER|C10856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10856_01 - Ubisoft Entertainment Inc.|| RSER|C10857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10857_01 - Houghton Mifflin Company|| RSER|C10859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10859_01 - Taleo|| RSER|C10865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10865_01 - AP Conseils|| RSER|C10866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10866_01 - Groupe LSI|| RSER|C10878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10878_01 - Cadillac Fairview Corporation|| RSER|C10887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10887_01 - CDM - Communications Design and Management|| RSER|C10890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10890_01 - Bell Real Estate|| RSER|C10891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10891_01 - Maritime Data Center Inc.|| RSER|C10895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10895_01 - ITC - International Trade Centre|| RSER|C10896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10896_01 - Approva Corporation|| RSER|C10899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10899_01 - Royal Solution|| RSER|C10905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10905_01 - Delta Solutions|| RSER|C10909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10909_01 - Computer Aid Inc.|| RSER|C10913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10913_01 - AEG Worldwide|| RSER|C10913_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10913_02 - AEG Worldwide|| RSER|C10914_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10914_01 - Centris|| RSER|C10915_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10915_01 - Volunteers of America National Services|| RSER|C10916_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10916_01 - CRE - Centre de réadaptation de l'Estrie|| RSER|C10918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10918_01 - Transax Technologies Inc.|| RSER|C10925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10925_01 - Arrow Business Consulting|| RSER|C10930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10930_01 - Workopolis|| RSER|C10934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10934_01 - Ogilvy Renault|| RSER|C10945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10945_01 - Strict Sécurité|| RSER|C10954_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10954_01 - energie numerique Canada Inc.|| RSER|C10955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10955_01 - Edelman|| RSER|C10956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10956_01 - Le Reseau Quebec Global 100|| RSER|C10958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10958_01 - Normandin Beaudry Actuaires Conseils Inc.|| RSER|C10960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10960_01 - SCM Risk Management Services Inc.|| RSER|C10969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10969_01 - Acronis, Inc|| RSER|C10970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10970_01 - ACS - Accounting and Computer Solutions|| RSER|C10971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10971_01 - Jolicoeur et Associés|| RSER|C10976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10976_01 - Gallo, Vitucci and Klar|| RSER|C10977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10977_01 - Compagnie France Film Inc.|| RSER|C10984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10984_01 - ATG - Art Technology Group Limited|| RSER|C10991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10991_01 - Logica|| RSER|C11002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11002_01 - UCRQ|| RSER|C11002_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11002_02 - UCRQ|| RSER|C11002_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11002_03 - UCRQ|| RSER|C11002_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11002_04 - UCRQ - AUD|| RSER|C11003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11003_01 - NAS Recruitment|| RSER|C11008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11008_01 - ICO Technologies|| RSER|C11020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11020_01 - Blue Star Operating|| RSER|C11026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11026_01 - HWG Corpo Fin Quebec|| RSER|C11028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11028_01 - Race Rocks 3D|| RSER|C11034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11034_01 - DCFS Information Technology Services (ITS)|| RSER|C11057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11057_01 - Association Des Employeurs Maritime, L'|| RSER|C11059_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11059_01 - Woodbine Entertainment Group|| RSER|C11076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11076_01 - Aplica Tecnologia Avanzada SA de CV|| RSER|C11098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11098_01 - Travis Property Management, LLC|| RSER|C11104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11104_01 - Soeurs du Bon-Pasteur de Québec, Les|| RSER|C11182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11182_01 - Agilix Labs Inc.|| RSER|C11190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C11190_01 - Baptist Foundation of Texas|| RSER|C22249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22249_01 - Datactiva Ltda.|| RSER|C22250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C22250_01 - Deloitte|| RSER|C31586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31586_01 - PS Target Budgetkund (anvands ej)|| RSER|C31587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31587_01 - PS General Budgetkund (anvands ej)|| RSER|C31650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31650_01 - Trygghetsradet|| RSER|C40314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C40314_01 - SVR|| RSER|C40336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C40336_01 - Cerdo bankpartner|| RSER|C40344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C40344_01 - OM|| RSER|C40372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C40372_01 - Svenska Kyrkans Forsakringsforening|| RSER|C51112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51112_01 - AIP|| RSER|C51124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51124_01 - AP Fastigheter|| RSER|C51125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51125_01 - APCER|| RSER|C51317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51317_01 - IDT Target Budgetkund (anvands ej)|| RSER|C51332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51332_01 - IXOPEN|| RSER|C51342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51342_01 - KAISA|| RSER|C51390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51390_01 - MAX Hamburgerrestauranger|| RSER|C51404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51404_01 - Misc|| RSER|C51531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51531_01 - SAKAB|| RSER|C51602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51602_01 - Svensk Fastighetsformedling|| RSER|C51604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51604_01 - Svenska Golfforbundet|| RSER|C51606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51606_01 - Svenska Spel|| RSER|C51686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51686_01 - Agresso|| RSER|C51753_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51753_01 - Atlas Copco Group|| RSER|C51773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51773_01 - Gunnebo|| RSER|C51786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51786_01 - Maintpartner|| RSER|C51796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51796_01 - Ovako|| RSER|C51812_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51812_01 - SDC EK FoR|| RSER|C51836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51836_01 - Sonat|| RSER|C51847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51847_01 - ATG|| RSER|C51853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51853_01 - Claes Ohlsson|| RSER|C51865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51865_01 - MAX Hamburgerrestauranger|| RSER|C51869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51869_01 - On,Line|| RSER|C51878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51878_01 - Svenska Golfforbundet|| RSER|C51880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51880_01 - Svenska Spel|| RSER|C51886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51886_01 - Svevia|| RSER|C51887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51887_01 - Agresso|| RSER|C51888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51888_01 - Atea|| RSER|C51889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51889_01 - Bluegarden|| RSER|C51891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51891_01 - ISS|| RSER|C51894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51894_01 - Malerifakta|| RSER|C51899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51899_01 - Securitas|| RSER|C51900_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51900_01 - Services|| RSER|C51902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51902_01 - Sodexo|| RSER|C51903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51903_01 - SWECO|| RSER|C51904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51904_01 - Svensk Fastighetsformedling|| RSER|C51905_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51905_01 - TTI Services & Other|| RSER|C51952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51952_01 - Blokeret - HedeDanmark A/S - brug 56259|| RSER|C60170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60170_01 - 1TO1 SAC|| RSER|C60178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60178_01 - CHRISTOPHER CESAR CEPERO MEN|| RSER|C60185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60185_01 - ESPINOSA-GARRETA RAMON A.|| RSER|C60188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60188_01 - INTERCORP PERU LTD|| RSER|C60190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60190_01 - J & V INVERSIONES S.A.C|| RSER|C60192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C60192_01 - LASINO SA.|| RSER|C70622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70622_01 - Svenska UMTS Nat|| RSER|C70629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70629_01 - Bonnier Koncernen|| RSER|C70631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70631_01 - Infodata|| RSER|C70636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70636_01 - Aker Kvaerner|| RSER|C81422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81422_01 - BlackBerry|| RSER|C80028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C80028_01 - Manpower Toronto|| RSER|C52013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C52013_01 - Dansk Metal|| RSER|C81550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81550_01 - Solium Capital Inc.|| RSER|C81587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81587_01 - Fillactive|| RSER|C81600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81600_01 - Children's Aid Society of Toronto|| RSER|C81603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81603_01 - HOTELBEDS TECHNOLOGY, S.L.U.|| RSER|C81611_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81611_01 - Beat the Market|| RSER|C81613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81613_01 - International Masters Games Association|| RSER|C10448_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10448_06 - Steria|| RSER|C81703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81703_01 - BlueSoft Sp. z o.o.|| RSER|C81643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81643_01 - Claus S?rensen A/S|| RSER|C81666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81666_01 - G. Tscherning A/S|| RSER|C81693_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81693_01 - C81693_01 - Federated Cooperatives Limited|| RSER|C81695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81695_01 - Braille Jymico Inc.|| RSER|C81636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81636_01 - Avanade Inc.|| RSER|C81647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81647_01 - Applus+ Danmark A/S|| RSER|C81619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81619_01 - C81619_01 - Federated Co-operatives Ltd.|| RSER|C81694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81694_01 - Assoc. of Prof. Engineers & Geoscientists-Alberta|| RSER|C81698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81698_01 - Federated Cooperatives Limited|| RSER|C81620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81620_01 - ISS Facility Services A/S|| RSER|C81666_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81666_02 - C81666_01 - G. Tscherning A/S|| RSER|C10032_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10032_12 - Hewlett Packard India Sales Pvt. Ltd|| RSER|C81710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81710_01 - C81710_01 - SVI Consulting Ltd.|| RSER|C81712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81712_01 - Proxcellence|| RSER|C81721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81721_01 - Fujitsu|| RSER|C81728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81728_01 - Spatial Economics|| RSER|C81735_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81735_01 - C81735_01 - Donorworx Inc.|| RSER|C81742_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81742_01 - PwC Management Services LP|| RSER|C81754_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81754_01 - Atos Belgium|| RSER|C81757_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81757_01 - Fellesforbundet|| RSER|C81760_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81760_01 - Eurest AS|| RSER|C81777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81777_01 - Teknologisk Institutt AS|| RSER|C81792_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81792_01 - Weibull AS|| RSER|C81795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81795_01 - TARGO IT CONSULTING GMBH SINGAPORE BRANC|| RSER|C81798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81798_01 - FUTURSKIL|| RSER|C10570_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10570_05 - Deloitte & Touche Inc.|| RSER|C81802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81802_01 - Qpark|| RSER|C81856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81856_01 - Deliotte|| RSER|C81866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81866_01 - Brass Door Pub|| RSER|C81877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81877_01 - Harvey Nash|| RSER|C81802_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81802_02 - Q-Park N.V.|| RSER|C81895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81895_01 - Microsoft|| RSER|C81897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81897_01 - SFE|| RSER|C81899_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81899_01 - SOLSIKKA|| RSER|C81918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81918_01 - Computer Science Corporation|| RSER|C81919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81919_01 - IBM|| RSER|C10059_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C10059_02 - BARREAU DU QUEBEC|| RSER|C10842_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RRET_Att|C10842_05 - FAFIEC|| RSER|C81953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81953_01 - Perisher Blue Pty Ltd|| RSER|C81955_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81955_01 - Open Text Pty Limited|| RSER|C81966_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81966_01 - By Light Professional IT Services, Inc.|| RSER|C81971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81971_01 - Services Conseils Sylvain Granger|| RSER|C81980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81980_01 - Informatica|| RSER|C81991_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C81991_01 - Centraide du Grand Montr?al|| RSER|C51121_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51121_12 - AMADEUS FRANCE SA|| RSER|C82002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82002_01 - TMA Data Management Limited|| RSER|C82004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82004_01 - WorkPac Pty Ltd|| RSER|C82013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82013_01 - VITO|| RSER|C82014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82014_01 - IBOR|| RSER|C82015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82015_01 - S+P Lion AG|| RSER|C82027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82027_01 - Fondation Jeunesse-Vie|| RSER|C82032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82032_01 - Mise en March? Indicia Inc.|| RSER|C82033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82033_01 - EvoluSys SA|| RSER|C82091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82091_01 - Besikta Bilprovning i Sverige AB|| RSER|C82093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82093_01 - eWork Scandinavia AB|| RSER|C82094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82094_01 - Altran Sverige AB|| RSER|C82097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82097_01 - 3 Step IT Sweden AB|| RSER|C82098_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82098_01 - Svenska M�ssan Stiftelse|| RSER|C82099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82099_01 - IL Recycling Service AB|| RSER|C82100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82100_01 - AB Svensk Bilprovning|| RSER|C82120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82120_01 - Trossamfundet Svenska Kyrkan|| RSER|C82131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82131_01 - Accenture Inc|| RSER|C82154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82154_01 - IBM Pakistan|| RSER|C82177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82177_01 - By Light Professional IT Services, Inc|| RSER|C82189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82189_01 - USG Public Sourcing|| RSER|C82193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82193_01 - FCC - Fomento de Construcciones y Contratas|| RSER|C82195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82195_01 - FCC - Control de Costes por Operacion|| RSER|C82139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82139_01 - HWG CRM|| RSER|C82233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82233_01 - Sponda Oyj|| RSER|C82238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82238_01 - YAP Solutions Oy|| RSER|C82243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82243_01 - Canadian Council of Chief Executives|| RSER|C82244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82244_01 - INVID Falun AB|| RSER|C82251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82251_01 - Tishman Speyer Properties, L.P.|| RSER|C31076_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C31076_02 - Unysis|| RSER|C82271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82271_01 - Lemontree|| RSER|C82279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82279_01 - J-FAB Consult AB|| RSER|C82280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82280_01 - Wipro Sweden, filial to Wipro Ltd Indien|| RSER|C82292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82292_01 - HWG SWEDEN INTERNAL PROJECTS ONLY|| RSER|C82312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82312_01 - ohrlings PricewaterhouseCoopers AB|| RSER|C82319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82319_01 - Svenska Massan Stiftelse|| RSER|C82332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82332_01 - Aleris Holding AB|| RSER|C82343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82343_01 - Lavery de Billy|| RSER|C82345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82345_01 - Hamel Construction|| RSER|C82346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82346_01 - Alithya|| RSER|C82351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82351_01 - Astral Consulting Services Pty Ltd|| RSER|C82367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82367_01 - Peoplebank|| RSER|C82368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82368_01 - Quantium|| RSER|C82402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82402_01 - GENTIS|| RSER|C82405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82405_01 - JArchitects|| RSER|C82415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82415_01 - Select Staffing|| RSER|C82420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82420_01 - HWG Group - Internal|| RSER|C82438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82438_01 - Park Inn Heathrow Ltd|| RSER|C82440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82440_01 - Red Snapper Recruitment Ltd|| RSER|C82445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82445_01 - Atos S.A. (France)|| RSER|C82453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82453_01 - Nvoke Partners|| RSER|C82484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82484_01 - ACCENTURE (UK) LIMITED|| RSER|C82496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82496_01 - Kluwer|| RSER|C82503_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82503_01 - Other GH|| RSER|C82504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82504_01 - Other OUC|| RSER|C82505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82505_01 - Other SDI|| RSER|C82506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82506_01 - Other TPL|| RSER|C82514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82514_01 - GLS IT Services GmbH|| RSER|C82515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82515_01 - Integrata AG|| RSER|C82551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82551_01 - Intergraph Canada Ltd.|| RSER|C82558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82558_01 - CHED Services Pty Ltd|| RSER|C82562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82562_01 - T.E.S. Contract Services Inc.|| RSER|C82622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82622_01 - Xerox Business Services, LLC|| RSER|C82644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82644_01 - Wyndham Vacation Ownership|| RSER|C82772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82772_01 - Gaming Laboratories International|| RSER|C82784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82784_01 - Immeubles Rythme Inc.|| RSER|C82785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82785_01 - Arion Orchestre Baroque|| RSER|C82790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82790_01 - Maison BiTler Inc.|| RSER|C82794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82794_01 - Randstad IntTrim Inc.|| RSER|C82798_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82798_01 - Northlands|| RSER|C82814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82814_01 - AIPSO|| RSER|C82822_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82822_01 - Ocean Clean GmbH|| RSER|C82836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82836_01 - Galley|| RSER|C82841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82841_01 - PA Consulting Services Ltd|| RSER|C82844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82844_01 - CWB Group|| RSER|C82857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82857_01 - Solution EPM|| RSER|C82859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82859_01 - Le Cercle des PrTsidents du QuTbec|| RSER|C82902_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82902_01 - ACCESSGROUP|| RSER|C82903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82903_01 - ACCENTURELLP|| RSER|C82904_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82904_01 - TUCANADA|| RSER|C82910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82910_01 - PARTNERSHCSYS,INC.|| RSER|C82924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82924_01 - OSWEGOGROUP|| RSER|C82946_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82946_01 - Accenture|| RSER|C82949_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82949_01 - Artech Information Systems LLC|| RSER|C82963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82963_01 - PS_ARTS|| RSER|C82964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82964_01 - PS_DMS_Support|| RSER|C82965_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82965_01 - PS_ICAPS|| RSER|C82983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82983_01 - Systems & Software Inc.|| RSER|C82998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C82998_01 - Serti Informatique Inc|| RSER|C83002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83002_01 - Comit� Paritaire Des Agents De S�curit�|| RSER|C83003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83003_01 - Grey Eagle Resort and Casino|| RSER|C83033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83033_01 - Advantage Maintenance|| RSER|C83039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83039_01 - Advantage Maintenance|| RSER|C83052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83052_01 - Groupe Helios|| RSER|C83019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83019_01 - Maxxum360|| RSER|C83020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83020_01 - WindTalker|| RSER|C83022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83022_01 - Box, Inc.|| RSER|C83024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83024_01 - Legion of the Bouncy Castle Inc|| RSER|C83041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83041_01 - Employbridge, LLC|| RSER|C83044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83044_01 - Hoike Services, Inc|| RSER|C83045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83045_01 - Hyphenus, inc|| RSER|C83069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83069_01 - Maxxum360|| RSER|C83082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83082_01 - GR2|| RSER|C83095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83095_01 - Huxley Associates Belgium NV|| RSER|C83097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83097_01 - PASSIO Consulting|| RSER|C83129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83129_01 - TASCORP|| RSER|C83134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83134_01 - SNC-Lavalin Group Inc.|| RSER|C83140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83140_01 - OpenText|| RSER|C83171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83171_01 - Actic Sverige AB|| RSER|C83163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83163_01 - Easit AB|| RSER|C83157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83157_01 - Enova Technology Corp|| RSER|C83179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83179_01 - FEDERAL GROUP|| RSER|C83172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83172_01 - HCL Technologies Sweden AB|| RSER|C83168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83168_01 - IMD International|| RSER|C83159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83159_01 - LightShip Security, Inc.|| RSER|C83170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83170_01 - Nynashamns kommun Fakturaservice|| RSER|C83161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83161_01 - R. Twining and Company Limited|| RSER|C83182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83182_01 - Saddle Operating LLC|| RSER|C83167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83167_01 - Voestalpine group-IT AB|| RSER|C83197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83197_01 - Borgholm Energi AB|| RSER|C83204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83204_01 - Egmont Publishing AB|| RSER|C83209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83209_01 - Scandinavian Standard Nordic AB|| RSER|C83214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83214_01 - D.L.G.L. Lt?e|| RSER|C83215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83215_01 - FSA Sant? Management|| RSER|C83216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83216_01 - Irosoft Inc.|| RSER|C83220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83220_01 - Groupe d'Alimentation MTY Inc.|| RSER|C83227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83227_01 - Home Office Digital|| RSER|C83229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83229_01 - Cognizant Technology Solutions Uk Ltd|| RSER|C83235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83235_01 - Toerisme Vlaanderen|| RSER|C83236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83236_01 - SOCOTEC France|| RSER|C83245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83245_01 - ATK ELECTRICAL PTY LTD|| RSER|C83250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83250_01 - MONOPRIX SA|| RSER|C83251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83251_01 - RITMX|| RSER|C83253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83253_01 - Danson Decor Inc.|| RSER|C83265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83265_01 - KEYW Corporation|| RSER|C83268_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83268_01 - Allegro Consultancy|| RSER|C83271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83271_01 - Junifer Systems Ltd|| RSER|C83278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83278_01 - Caritas-S??ti? sr|| RSER|C83279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83279_01 - Caritas-S??ti? sr|| RSER|C83282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83282_01 - Helsingin kaupunki Sosiaali- ja|| RSER|C83283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83283_01 - Helsingin kaupunki Sosiaali- ja|| RSER|C83292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83292_01 - ADT Canada Inc.|| RSER|C83260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83260_01 - IMAX Corporation|| RSER|C83297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83297_01 - Ibiska Telecom Inc.|| RSER|C83299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83299_01 - Distech Controls Inc|| RSER|C83324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83324_01 - Coronaria Hoiva Oy|| RSER|C83326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83326_01 - Coronaria Hoiva Oy|| RSER|C83331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83331_01 - ZeroChaos|| RSER|C83339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83339_01 - Assemblin|| RSER|C83340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83340_01 - Assemblin|| RSER|C83344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83344_01 - Deltatec|| RSER|C83346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83346_01 - LENDLEASE SERVICES PTY LIMITED|| RSER|C83347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83347_01 - BETFAIR|| RSER|C83353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83353_01 - eApeiron|| RSER|C83359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83359_01 - IPALCO Enterprises, Inc.|| RSER|C83361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83361_01 - BUZA|| RSER|C83366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83366_01 - Logius|| RSER|C83370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83370_01 - SSC-ICT|| RSER|C83384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83384_01 - Sundegruppen|| RSER|C83387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83387_01 - Sundegruppen|| RSER|C83388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83388_01 - ZNX (2) PTY LTD|| RSER|C83390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83390_01 - JM Family Enterprises, Inc.|| RSER|C83393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83393_01 - JM Family Enterprises, Inc.|| RSER|C51465_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51465_02 - SOCOTEC|| RSER|C70528_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C70528_10 - SOCOTEC|| RSER|C75029_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C75029_02 - HERMES|| RSER|C83400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83400_01 - HWG Group - Internal|| RSER|C83405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83405_01 - Automic CanadaLogiciels Inc.|| RSER|C83410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83410_01 - Competitive Capabilities Internation LTD|| RSER|C83415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83415_01 - Up and Running, Inc.|| RSER|C83417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83417_01 - NC - County of Cumberland|| RSER|C83420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83420_01 - eApeiron|| RSER|C83422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83422_01 - Workstream Lead|| RSER|C83423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83423_01 - Innovate UK|| RSER|C83428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83428_01 - Nigel Frank International Ltd|| RSER|C83429_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83429_01 - European Parliament Brussels|| RSER|C83449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83449_01 - C3 Solutions|| RSER|C83451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83451_01 - Belron Canada Inc.|| RSER|C83468_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83468_01 - ASSETLINK|| RSER|C83473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83473_01 - IPALCO Enterprises, Inc.|| RSER|C83474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83474_01 - NC - Mecklenberg County|| RSER|C83475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83475_01 - Immeubles Rythme Inc.|| RSER|C51465_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51465_10 - SOCOTEC|| RSER|C83464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83464_01 - TNS Mobile Oy|| RSER|C83476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83476_01 - Allegis Global Solutions|| RSER|C83478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83478_01 - American Association for the Advancement|| RSER|C83481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83481_01 - Anaqua, Inc.|| RSER|C83484_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83484_01 - Author-It|| RSER|C83488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83488_01 - Boston Consulting Group|| RSER|C83489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83489_01 - BostonCIO, LLC|| RSER|C83490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83490_01 - Breech Alert, LLC|| RSER|C83491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83491_01 - Carbonite|| RSER|C83492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83492_01 - HWG Group- Internal|| RSER|C83499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83499_01 - Dynatrace|| RSER|C83503_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83503_01 - Harvard Business Publishing|| RSER|C83513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83513_01 - Journal of Bone & Joint Surgery|| RSER|C83514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83514_01 - L-3 Communications Security & Detection|| RSER|C83517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83517_01 - Makibie|| RSER|C83519_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83519_01 - M-Files|| RSER|C83521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83521_01 - NextSource|| RSER|C83525_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83525_01 - PAREXEL International Corporation|| RSER|C83527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83527_01 - Runzheimer International Ltd.|| RSER|C83528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83528_01 - Shared Technology Services, Group, Inc.|| RSER|C83531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83531_01 - Tableau Software, Inc.|| RSER|C83536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83536_01 - The Darton Group LLC|| RSER|C83550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83550_01 - CC Services, Inc.|| RSER|C83551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83551_01 - Central Source LLC|| RSER|C83553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83553_01 - IBM Corporation|| RSER|C83559_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83559_01 - Case Commons, Inc.|| RSER|C83562_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83562_01 - Ordina|| RSER|C83568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83568_01 - Biolin Scientific Holding AB|| RSER|C83575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83575_01 - Norsirk/Elretur|| RSER|C83577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83577_01 - WJS Canada|| RSER|C83579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83579_01 - Ontario Telemedicine Network|| RSER|C83582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83582_01 - OneShield, Inc.|| RSER|C83583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83583_01 - Union des artistes|| RSER|C83584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83584_01 - Th�atre du nouveau monde|| RSER|C83585_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83585_01 - Service R�gional d'Admission (SRAM)|| RSER|C83588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83588_01 - Oceanwide Canada Inc.|| RSER|C83589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83589_01 - ACVRQ - Salon du VR|| RSER|C83590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83590_01 - FEI Canada Section du Qu�bec|| RSER|C83591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83591_01 - Pivot 88|| RSER|C83594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83594_01 - CyberSecurity Malaysia|| RSER|C83597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83597_01 - T.E.S. Contract Services Inc.|| RSER|C83598_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83598_01 - APSM|| RSER|C83603_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83603_01 - InfoSys Public Services|| RSER|C83604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83604_01 - Society for Human Resource Management|| RSER|C83608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83608_01 - Zinfra|| RSER|C83609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83609_01 - LENDLEASE SERVICES PTY LIMITED|| RSER|C83619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83619_01 - KPMG LLP (Canada)|| RSER|C83620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83620_01 - Groupe Concerti|| RSER|C83621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83621_01 - Trevi|| RSER|C83624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83624_01 - Musee des Beaux-Arts de Montreal|| RSER|C83625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83625_01 - Automic Canada Logiciels Inc.|| RSER|C83627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83627_01 - Club Social|| RSER|C83629_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83629_01 - CoupGon|| RSER|C83630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83630_01 - D.L.G.L. Ltee|| RSER|C83631_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83631_01 - Eglise catholique de Montreal|| RSER|C83635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83635_01 - POMERLEAU|| RSER|C83636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83636_01 - Stantec|| RSER|C83637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83637_01 - Association du Camionage du Quebec|| RSER|C83638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83638_01 - Valeurs mobiliFres PEAK Inc.|| RSER|C83641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83641_01 - Success Information Systems|| RSER|C83647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83647_01 - eApeiron|| RSER|C83663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83663_01 - MVP Consulting Plus, Inc.|| RSER|C83666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83666_01 - Monster Worldwide|| RSER|C83670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83670_01 - Financial & Human Capital Mgmt|| RSER|C83671_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83671_01 - ECommerce Systems|| RSER|C83672_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83672_01 - Oncore Consulting LLC|| RSER|C83674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83674_01 - Primetals Technologies|| RSER|C83677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83677_01 - Commerzbank CZ|| RSER|C83683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83683_01 - Deloitte Advisory s.r.o.|| RSER|C83686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83686_01 - E.ON CZ|| RSER|C83701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83701_01 - ACS|| RSER|C83707_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83707_01 - Canadian Sport Institute Pacific (CSI)|| RSER|C83709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83709_01 - 3E Company|| RSER|C83710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83710_01 - ABN AMRO Services Inc.|| RSER|C83711_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83711_01 - Accenture|| RSER|C83712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83712_01 - ACCESS GROUP|| RSER|C83714_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83714_01 - ADT|| RSER|C83721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83721_01 - AMERICA ON-LINE|| RSER|C83743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83743_01 - Assurant Solutions|| RSER|C83764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83764_01 - BEAM Coop|| RSER|C83769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83769_01 - Black & Veatch Management Consulting LLC|| RSER|C83782_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83782_01 - CableLabs|| RSER|C83784_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83784_01 - Cambrian Management, LTD|| RSER|C83787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83787_01 - CARESPARK|| RSER|C83790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83790_01 - CD RESOURCES|| RSER|C83794_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83794_01 - HWG Def WIP|| RSER|C83795_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83795_01 - HWG Group - Internal|| RSER|C83821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83821_01 - Comcast IP Services, LLC|| RSER|C83829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83829_01 - COVANSYS|| RSER|C83833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83833_01 - CRI Catalyst Company, LP|| RSER|C83834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83834_01 - Criterion Catalysts and Technologies LP|| RSER|C83848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83848_01 - Deloitte Consulting|| RSER|C83858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83858_01 - EDS|| RSER|C83859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83859_01 - EL COYOTE RANCH|| RSER|C83861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83861_01 - ELLIOTT & GILMORE, LLC|| RSER|C83891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83891_01 - GAELIC MANAGEMENT, INC.|| RSER|C83903_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83903_01 - GROUP360|| RSER|C83911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83911_01 - HBI MANAGEMENT SERVICES, LLC|| RSER|C83912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83912_01 - HC-PVR-AFFILIA. COMP SVCS-ACS|| RSER|C83921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83921_01 - IBM Corporation|| RSER|C83925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83925_01 - INFORMS - SIS|| RSER|C83933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83933_01 - JM Family Enterprises, Inc.|| RSER|C83952_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83952_01 - LLOX, L.L.C|| RSER|C83962_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83962_01 - MAROPCO|| RSER|C83973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83973_01 - Merchant Customer Exchange LLC|| RSER|C83996_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C83996_01 - NCR Corporation|| RSER|C84005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84005_01 - North Carolina (DOR)|| RSER|C84012_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84012_01 - Online Data Exchange, LLC|| RSER|C84018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84018_01 - OSWEGO GROUP|| RSER|C84031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84031_01 - Peregrine Group|| RSER|C84042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84042_01 - PROF DATASOLUTIONS (PDI)|| RSER|C84057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84057_01 - Rising Phoenix Royalties, LLC|| RSER|C84058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84058_01 - ROCK ISLAND RESOURCES CO. INC.|| RSER|C84062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84062_01 - RUSK CAPITAL MANAGEMENT LLC|| RSER|C84076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84076_01 - SMITH VICARS, LLC|| RSER|C84078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84078_01 - SNYDER ASSOCIATED COMPANIES|| RSER|C84079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84079_01 - Softek Inc|| RSER|C84085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84085_01 - SSL Solutions, Inc|| RSER|C84108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84108_01 - TAPESTRY-INTERNAL|| RSER|C84109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84109_01 - Target|| RSER|C84111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84111_01 - TCEQ Information Resources|| RSER|C84146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84146_01 - Verizon Supply Chain Systems|| RSER|C84148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84148_01 - VIRGINIA EMPLOYMENT COMMISSION|| RSER|C84149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84149_01 - VIRGINIA INFORMATION TECHNOLOGIES AGENCY|| RSER|C84151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84151_01 - VIVA INTERNATIONAL WINDOWS|| RSER|C84171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84171_01 - Wyndham Vacation Ownership|| RSER|C84183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84183_01 - Society for Human Resource Management|| RSER|C84190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84190_01 - HWG-AMS|| RSER|C84201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84201_01 - MVP Consulting Plus, Inc.|| RSER|C84204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84204_01 - Monster Worldwide|| RSER|C84207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84207_01 - eApeiron|| RSER|C84213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84213_01 - ECMWF|| RSER|C84214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84214_01 - WorldVu Development LLC|| RSER|C84218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84218_01 - RE.GROUP PTY LIMITED|| RSER|C84220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84220_01 - MUNICH HOLDINGS OF AUSTRALASIA PTY LIMIT|| RSER|C84221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84221_01 - Jabil IoT Product Testing|| RSER|C21925_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21925_07 - ACCOR|| RSER|C21927_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21927_07 - BUT|| RSER|C21963_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21963_02 - PMU|| RSER|C21963_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21963_07 - PMU|| RSER|C21963_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C21963_10 - PMU|| RSER|C51459_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C51459_10 - OTHERS - PERSONAL SERVICES|| RSER|C84225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84225_01 - Levio Conseils|| RSER|C84229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84229_01 - Compass|| RSER|C84233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84233_01 - EA Renfroe & Company, Inc.|| RSER|C84238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84238_01 - Hendrick Automotive Group|| RSER|C84245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84245_01 - North American Electric Reliability|| RSER|C84246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84246_01 - Nissan North America|| RSER|C84248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84248_01 - Propex|| RSER|C84250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84250_01 - Ramsey Solutions|| RSER|C84252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84252_01 - Rentokil North America|| RSER|C84253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84253_01 - Rollins, Inc.|| RSER|C84254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84254_01 - Saul's Seismic|| RSER|C84256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84256_01 - SCOR|| RSER|C84259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84259_01 - Steritech|| RSER|C84277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84277_01 - AIOI|| RSER|C84282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84282_01 - ATS|| RSER|C84285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84285_01 - Comcast Enterprise Technology|| RSER|C84286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84286_01 - TechBridge, Inc.|| RSER|C84289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84289_01 - HGS Colibrium, Inc.|| RSER|C84291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84291_01 - Microsoft|| RSER|C84294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84294_01 - Pivotal|| RSER|C84295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84295_01 - Resilient|| RSER|C84299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84299_01 - Aclara Meters UK Ltd|| RSER|C84300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84300_01 - Secure Meters (UK) Ltd|| RSER|C84301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84301_01 - USG People Business Solutions (Solvus)|| RSER|C84304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84304_01 - Advania EHF|| RSER|C84312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84312_01 - Collaborative Composite Solutions Corp|| RSER|C84319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84319_01 - Nymi Inc.|| RSER|C84320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84320_01 - Isara Corp.|| RSER|C84321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84321_01 - 49 Solutions|| RSER|C84322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84322_01 - S.i.Systems Ltd|| RSER|C84324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84324_01 - ikaSystems Corporation|| RSER|C84329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84329_01 - CohnReznick LLP|| RSER|C84333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84333_01 - Internal|| RSER|C84342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84342_01 - Trilliant Networks (UK) Ltd|| RSER|C84345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84345_01 - Agilisys Limited|| RSER|C84351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84351_01 - One Main Financial Services|| RSER|C84372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84372_01 - Kal Tire|| RSER|C84374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84374_01 - Axialdev|| RSER|C84376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84376_01 - Opera de Montreal|| RSER|C84379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84379_01 - Commissaire Lobbyisme QC|| RSER|C84380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84380_01 - SIM - Service d'intervention sur mesure INC.|| RSER|C84381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84381_01 - Cofomo Qu�bec|| RSER|C84382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84382_01 - Les services conseils ABna|| RSER|C84383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84383_01 - RentPath LLC|| RSER|C84384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84384_01 - Computer Aid|| RSER|C84387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84387_01 - eApeiron|| RSER|C84392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84392_01 - RECTIFIER TECHNOLOGIES PACIFIC PTY LTD|| RSER|C84393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84393_01 - SUEZ RECYCLING & RECOVERY HLDGS PTY LTD|| RSER|C84403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84403_01 - Interal|| RSER|C84408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84408_01 - Nokia Corp|| RSER|C84411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RSER_Att|C84411_01 - RentPath|| Retail_and_Consumer_Services|RCPG|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| RCPG|C22020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C22020_01 - ED & F MAN COCOA LIMITED|| RCPG|C50030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50030_01 - Aliments Ultima Inc.|| RCPG|C50030_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50030_02 - Aliments Ultima Inc.|| RCPG|C50030_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50030_03 - Aliments Ultima Inc.|| RCPG|C50030_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50030_04 - Aliments Ultima Inc.|| RCPG|C50178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50178_01 - Coppley Apparel Group|| RCPG|C50178_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50178_02 - Coppley Apparel Group|| RCPG|C50181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50181_01 - Cott Beverage Corporation|| RCPG|C50181_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50181_03 - Cott Beverage Corporation|| RCPG|C50181_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50181_04 - Cott Beverage Corporation|| RCPG|C50181_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50181_05 - Cott Beverage Corporation|| RCPG|C50181_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50181_06 - Cott Beverage Corporation|| RCPG|C51204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51204_01 - COCA-COLA AMATIL LIMITED|| RCPG|C51236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51236_01 - DK Company A/S|| RCPG|C51257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51257_01 - ESSILOR|| RCPG|C51257_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51257_02 - ESSILOR|| RCPG|C51257_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51257_03 - ESSILOR|| RCPG|C51257_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51257_04 - ESSILOR|| RCPG|C51257_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51257_05 - ESSILOR|| RCPG|C51257_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51257_06 - ESSILOR|| RCPG|C51257_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51257_08 - ESSILOR|| RCPG|C51421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51421_01 - Nestle|| RCPG|C51422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51422_01 - Nestle|| RCPG|C50253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50253_01 - Essilor|| RCPG|C50323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50323_01 - Imperial Tobacco Canada Limitée|| RCPG|C50323_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50323_02 - Imperial Tobacco Canada Limitée|| RCPG|C50323_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50323_03 - Imperial Tobacco Canada Limitee|| RCPG|C50326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50326_01 - Industries Lassonde Inc.|| RCPG|C50371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50371_01 - Les Fromages Saputo|| RCPG|C50371_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50371_02 - Les Fromages Saputo|| RCPG|C50371_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50371_03 - Les Fromages Saputo|| RCPG|C50375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50375_01 - Les vêtements de sport Gildan Inc.|| RCPG|C50375_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50375_02 - Gildan Activewear|| RCPG|C50422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50422_01 - Molson Canada|| RCPG|C50434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50434_01 - Natrel Inc.|| RCPG|C50848_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50848_01 - Nike|| RCPG|C50848_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50848_02 - Nike|| RCPG|C50931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50931_01 - Vancouver Island Brewery|| RCPG|C51034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51034_01 - Consoltex Inc.|| RCPG|C51035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51035_01 - Williamson-Dickie Manufacturing|| RCPG|C51044_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51044_01 - McCain Foods|| RCPG|C51045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51045_01 - Arc'teryx Equipment Inc.|| RCPG|C51133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51133_01 - Arla Foods|| RCPG|C51161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51161_01 - Baxx of Scandinavia A/S|| RCPG|C51575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51575_01 - Sociedade Central de Cervejas|| RCPG|C51623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51623_01 - The Absolut Company|| RCPG|C51628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51628_01 - Thule|| RCPG|C51654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51654_01 - Unicer|| RCPG|C51655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51655_01 - Unilever|| RCPG|C51696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51696_01 - Heineken|| RCPG|C51983_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51983_01 - Carletti A/S|| RCPG|C52007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52007_01 - Danish Bottling Company A/S|| RCPG|C52030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52030_01 - Dencon Foods A/S|| RCPG|C52085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52085_01 - Golf Copenhagen 2009 Aps|| RCPG|C52099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52099_01 - Heineken Entreprise S.A.S|| RCPG|C52118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52118_01 - Indasia A/S|| RCPG|C51455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_01 - OTHERS - CONVENIENCE GOODS|| RCPG|C51455_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_02 - OTHERS - CONVENIENCE GOODS|| RCPG|C51455_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_03 - OTHERS - CONVENIENCE GOODS|| RCPG|C51455_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_04 - OTHERS - CONVENIENCE GOODS|| RCPG|C51455_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_05 - OTHERS - CONVENIENCE GOODS|| RCPG|C51455_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_06 - OTHERS - CONVENIENCE GOODS|| RCPG|C51455_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_09 - OTHERS - CONVENIENCE GOODS|| RCPG|C51456_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51456_07 - OTHERS - CPG|| RCPG|C51456_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51456_09 - OTHERS - CPG|| RCPG|C51456_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51456_11 - OTHERS - CPG|| RCPG|C51456_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51456_12 - OTHERS - CPG|| RCPG|C51474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51474_01 - Oy Karl Fazer Ab|| RCPG|C51480_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_02 - PERNOD RICARD|| RCPG|C51480_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_03 - PERNOD RICARD|| RCPG|C51480_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_04 - PERNOD RICARD|| RCPG|C51480_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_05 - PERNOD RICARD|| RCPG|C51480_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_06 - PERNOD RICARD|| RCPG|C51480_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_07 - PERNOD RICARD|| RCPG|C51480_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_11 - PERNOD RICARD|| RCPG|C51481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51481_01 - PETERS FOOD SERVICES LTD|| RCPG|C51498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51498_01 - Process|| RCPG|C51506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51506_01 - Raisio Oyj|| RCPG|C51543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51543_01 - Scan|| RCPG|C51546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51546_01 - Scandinavian Tobacco Group A/S|| RCPG|C52124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52124_01 - Inter Leather A/S|| RCPG|C52126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52126_01 - Isabella A/S|| RCPG|C52148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52148_01 - Lactosan A/S|| RCPG|C52160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52160_01 - Linde Brandmateriel Aps|| RCPG|C52200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52200_01 - Nordisk Company A/S|| RCPG|C52201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52201_01 - Nordisk Freizeit GmbH|| RCPG|C52208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52208_01 - Økologisk Landsforening|| RCPG|C52284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52284_01 - Spectre A/S|| RCPG|C52290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52290_01 - Struer Brød A/S|| RCPG|C52291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52291_01 - Sunds Textiles A/S|| RCPG|C52309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52309_01 - Uhrenholt A/S|| RCPG|C52339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C52339_01 - ROYAL CANIN AUSTRALIA PTY LTD|| RCPG|C80842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80842_01 - Heineken UK LTD|| RCPG|C80936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80936_01 - ED & F MAN COCOA LIMITED|| RCPG|C80353_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80353_01 - Mars Petcare UK Ltd|| RCPG|C80369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80369_01 - Mars Food UK Ltd|| RCPG|C80409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80409_01 - Coca-Cola Bottling Co. United, Inc.|| RCPG|C80475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80475_01 - Vêtements Flip Design Inc|| RCPG|C80507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80507_01 - Britvic|| RCPG|C80512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80512_01 - Cargill|| RCPG|C80536_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80536_01 - Frank_Roberts_&_Son|| RCPG|C80549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80549_01 - Kellogg_Management_Services|| RCPG|C80597_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80597_01 - Swizzels_Matlow|| RCPG|C80620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80620_01 - Coca_Cola|| RCPG|C80630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80630_01 - Mars|| RCPG|C80721_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80721_01 - HTM Sport GmbH|| RCPG|C80806_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80806_01 - Centrale Laitière|| RCPG|C10110_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10110_02 - Coca Cola|| RCPG|C10110_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10110_03 - Coca Cola Production|| RCPG|C19999_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C19999_05 - Other Sub Sector RCPG|| RCPG|C51368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51368_01 - Lantmannen|| RCPG|C51456_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51456_02 - OTHERS - CPG|| RCPG|C51318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51318_01 - Ikea|| RCPG|C51382_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51382_02 - LVMH|| RCPG|C51382_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51382_03 - LVMH|| RCPG|C51382_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51382_06 - LVMH|| RCPG|C51382_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51382_07 - LVMH|| RCPG|C51382_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51382_12 - LVMH|| RCPG|C81515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81515_01 - Spectrum Resource Group Inc.|| RCPG|C51709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51709_01 - AJEPER SA|| RCPG|C51719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51719_01 - HAARSLEV INDUSTRIES S.A.C.|| RCPG|C51739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51739_01 - Scania CV|| RCPG|C51825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51825_01 - Thule|| RCPG|C51846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51846_01 - Arla Foods|| RCPG|C51852_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51852_01 - Carlsberg|| RCPG|C51863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51863_01 - Lantmannen|| RCPG|C51874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51874_01 - Scan|| RCPG|C50018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50018_01 - Agropur - Division fromages fins|| RCPG|C50018_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50018_02 - Agropur - Division fromages fins|| RCPG|C50018_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50018_03 - Agropur - Division fromages fins|| RCPG|C50090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50090_01 - Biscuits Rondeau Ltée|| RCPG|C50106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50106_01 - Au pain doré|| RCPG|C50116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50116_01 - Bridor Inc.|| RCPG|C50131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50131_01 - Canada Bread Company Limited|| RCPG|C50177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50177_01 - La Coop Fédérée|| RCPG|C50177_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50177_02 - La Coop Federee|| RCPG|C50190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50190_01 - Danone|| RCPG|C50206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50206_01 - Division de spécialité Lassonde Inc.|| RCPG|C50209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50209_01 - Domco Ins.|| RCPG|C50226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50226_01 - Effigi Inc.|| RCPG|C50318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50318_01 - Hydroserre Mirabel Inc.|| RCPG|C50320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50320_01 - Ice River Springs Company|| RCPG|C50341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50341_01 - Janes Family Foods|| RCPG|C50346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50346_01 - JTI - MacDonald Corporation|| RCPG|C50368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50368_01 - Les aliments O Sole Mio Inc.|| RCPG|C50369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50369_01 - Les entreprises Pâtes et|| RCPG|C50373_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50373_01 - Les Producteurs laitiers du Canada|| RCPG|C50395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50395_01 - Maple Leaf Foods|| RCPG|C50417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50417_01 - Midtown Meats|| RCPG|C50437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50437_01 - Nestle Canada|| RCPG|C50456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50456_01 - Nutreco Canada Inc.|| RCPG|C50481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50481_01 - Pepsi Canada Inc.|| RCPG|C50498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50498_01 - Plaisirs Gastronomiques|| RCPG|C50506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50506_01 - Premier Tech Ltee|| RCPG|C50691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50691_01 - Wings Food Company|| RCPG|C50706_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50706_01 - Reebok Corporation|| RCPG|C50814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50814_01 - Peerless Clothing|| RCPG|C50828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50828_01 - Sher-Wood Hockey|| RCPG|C50837_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50837_01 - Louis Garneau Sports Inc.|| RCPG|C50847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50847_01 - Agrana|| RCPG|C50892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50892_01 - The Allan Candy Company Limited|| RCPG|C50925_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50925_01 - Camporio Food Group Holding S.L.|| RCPG|C51006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51006_01 - Trudeau Corporation|| RCPG|C51040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51040_01 - SC Johnson Canada|| RCPG|C51192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51192_01 - Carlsberg|| RCPG|C10416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10416_01 - Sealy Canada Ltd|| RCPG|C10491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10491_01 - Usine de congélation de St-Bruno|| RCPG|C10695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10695_01 - Consoltex Inc.|| RCPG|C10158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10158_01 - Whyte's Food Corporation|| RCPG|C10304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10304_01 - Manoucher Food and Cie|| RCPG|C51497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51497_01 - Pripps|| RCPG|C51882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51882_01 - The Absolut Company|| RCPG|C80376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80376_01 - RHODES ORCHARDS|| RCPG|C80463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C80463_01 - Guitabec Inc|| RCPG|C81380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81380_01 - Saputo Inc.|| RCPG|C10201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10201_01 - Freeze-Dry Foods Limited|| RCPG|C10243_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10243_02 - OCE Imagistics|| RCPG|C10273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C10273_01 - La petite Bretonne|| RCPG|C11040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C11040_01 - CEWE COLOR AG and Co|| RCPG|C51656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51656_01 - Unilever|| RCPG|C51406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51406_01 - Molson Coors (StarBev)|| RCPG|C60329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C60329_01 - Molson Coors Brewing Company|| RCPG|C51634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51634_01 - TINE SA|| RCPG|C51694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51694_01 - FrieslandCampina|| RCPG|C81574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81574_01 - Mars Morocco SARL|| RCPG|C81575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81575_01 - Société Marocaine des Tabacs|| RCPG|C81623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81623_01 - Pandora A/S|| RCPG|C81628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81628_01 - Ticket to Heaven A/S|| RCPG|C81630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81630_01 - Dansk Wilton A/S|| RCPG|C81634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81634_01 - HC Handelscenter Venslev A/S|| RCPG|C81640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81640_01 - AgroTech A/S|| RCPG|C81644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81644_01 - Br?dr. Ewers A/S|| RCPG|C81646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81646_01 - Scan Wear ApS|| RCPG|C81722_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81722_01 - Goodman Fielder|| RCPG|C81770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81770_01 - Ringeriks Kraft AS|| RCPG|C81773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81773_01 - Hunter Douglas Norge AS|| RCPG|C81779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81779_01 - Thorn Norge AS|| RCPG|C81790_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81790_01 - Nordpolen skole|| RCPG|C81839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81839_01 - BAT Niemeyer|| RCPG|C81854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81854_01 - Greens Biscuits Pty Ltd|| RCPG|C81875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81875_01 - EnGlobe Corp.|| RCPG|C50253_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50253_02 - Essilor of America inc.|| RCPG|C81928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C81928_01 - Wilson Fabrics|| RCPG|C51035_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51035_02 - Williamson-Dickie Manufacturing|| RCPG|C51480_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_12 - PERNOD RICARD|| RCPG|C51480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51480_01 - PERNOD RICARD|| RCPG|C50911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C50911_01 - L'Oreal Canada Inc.|| RCPG|C51378_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_03 - L'Oreal|| RCPG|C51378_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_02 - L'Oreal (US)|| RCPG|C51378_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_09 - L'OREAL DENMARK A/S|| RCPG|C51378_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_10 - L'OREAL|| RCPG|C51378_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_07 - L'Oreal|| RCPG|C51378_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_11 - L'OREAL|| RCPG|C51378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_01 - L'Oreal|| RCPG|C51378_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_05 - L'Oreal|| RCPG|C51378_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_08 - L'Oreal|| RCPG|C51378_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_04 - L'Oreal|| RCPG|C51378_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_06 - L'Oreal|| RCPG|C82102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82102_01 - Cloetta Sverige AB|| RCPG|C82103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82103_01 - Estrella AB|| RCPG|C82105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82105_01 - Dole Europe GmbH|| RCPG|C82106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82106_01 - Scandistandard AB|| RCPG|C82113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82113_01 - Permobil AB|| RCPG|C82191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82191_01 - Hiram Walker & Sons Limited|| RCPG|C82203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82203_01 - Altia Oyj|| RCPG|C82205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82205_01 - Cloetta Suomi Oy|| RCPG|C82221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82221_01 - Oy Gustav Paulig Ab|| RCPG|C82225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82225_01 - Perheleipurit Oy|| RCPG|C82281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82281_01 - Lantmannen|| RCPG|C82318_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82318_01 - Scandi Standard AB|| RCPG|C82330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82330_01 - SILJAN Skog AB|| RCPG|C82406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82406_01 - Wielerbond Vlaanderen vzw|| RCPG|C82443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82443_01 - BSH Home Appliances Ltd|| RCPG|C82495_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82495_01 - Heineken|| RCPG|C82566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82566_01 - EXCELDOR|| RCPG|C82815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82815_01 - KODAK ALARIS INC.|| RCPG|C82818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82818_01 - Nestl� Personnel Services GmbH|| RCPG|C82838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82838_01 - PANDORA|| RCPG|C82846_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82846_01 - Groupe Procycle Inc.|| RCPG|C82851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82851_01 - KODAK ALARIS INC.|| RCPG|C82993_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C82993_01 - WILSON FABRICS|| RCPG|C83094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83094_01 - Vandemoortele|| RCPG|C83213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83213_01 - Lallemand inc|| RCPG|C83238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83238_01 - HERMES SELLIER|| RCPG|C83317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83317_01 - Pirkanmaan Osuuskauppa|| RCPG|C83319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83319_01 - Pirkanmaan Osuuskauppa|| RCPG|C51378_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51378_13 - L'Oreal|| RCPG|C51382_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51382_13 - LVMH|| RCPG|C51455_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51455_13 - OTHERS - CONVENIENCE GOODS|| RCPG|C51456_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C51456_13 - OTHERS - CPG|| RCPG|C83401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83401_01 - Olympe|| RCPG|C83403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83403_01 - MTY Tiki Ming Entreprises Inc.|| RCPG|C83427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83427_01 - Delitraiteur SA|| RCPG|C83443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83443_01 - OTHERS - CONVENIENCE GOODS|| RCPG|C83452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83452_01 - Groupe Biscuits Leclerc Inc|| RCPG|C83569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83569_01 - Norlander Zeelandia AB|| RCPG|C83587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83587_01 - Imperial Tobacco Canada|| RCPG|C31560_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C31560_09 - MARS|| RCPG|C31560_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C31560_11 - MARS|| RCPG|C83634_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83634_01 - Olympe|| RCPG|C83646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83646_01 - MA DUA|| RCPG|C83652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83652_01 - Colombo Energy, Inc|| RCPG|C83684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83684_01 - Stock Plzen-Bozkov s.r.o.|| RCPG|C83819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83819_01 - Coca Cola|| RCPG|C83872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83872_01 - ESSILOR|| RCPG|C83885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83885_01 - Fiskars Brands Inc.|| RCPG|C83945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C83945_01 - LaMarsa Corporation|| RCPG|C84080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84080_01 - SONIC, AMERICA'S DRIVE-IN|| RCPG|C84162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84162_01 - WHITE STAR|| RCPG|C84222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84222_01 - Pernod Ricard Canada Ltee.|| RCPG|C84240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84240_01 - Hooters of America|| RCPG|C84257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84257_01 - Southeastern Food Merchandisers|| RCPG|C84263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84263_01 - VF Corporation|| RCPG|C84327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84327_01 - WestRock|| RCPG|C84348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||RCPG_Att|C84348_01 - Imperial Produtos Alimentares|| MRD|Transportation|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Transportation|| Transportation|TPAV|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TPAV|C10013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10013_01 - AeroMag|| TPAV|C10013_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10013_02 - AeroMag|| TPAV|C10014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10014_01 - Aimia Canada Inc.|| TPAV|C10017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10017_01 - Air Canada|| TPAV|C10017_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10017_02 - Air Canada|| TPAV|C10017_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10017_03 - Air Canada|| TPAV|C10017_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10017_04 - Air Canada|| TPAV|C10017_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10017_05 - Air Canada|| TPAV|C11069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C11069_01 - Edmonton International Airport|| TPAV|C11073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C11073_01 - Bradley Air Services Limited|| TPAV|C30864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C30864_01 - CATSA - Canadian Air Transport Security Authority|| TPAV|C31479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C31479_01 - LA International|| TPAV|C30936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C30936_01 - International Civil Aviation Organization|| TPAV|C30936_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C30936_02 - Organisation de l'aviation civiles internationale|| TPAV|C31184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C31184_01 - Nav Canada|| TPAV|C31615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C31615_01 - SITA|| TPAV|C51201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51201_01 - Civil Aviation Authority|| TPAV|C51251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51251_01 - ENANA|| TPAV|C51264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51264_01 - Finnair Oyj|| TPAV|C51286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51286_01 - Gatwick Airport limited|| TPAV|C51311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51311_01 - IBERIA|| TPAV|C51380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51380_01 - Lufthansa|| TPAV|C51113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_01 - AIR FRANCE / KLM|| TPAV|C51113_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_02 - AIR FRANCE / KLM|| TPAV|C51113_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_03 - AIR FRANCE / KLM|| TPAV|C51113_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_04 - AIR FRANCE / KLM|| TPAV|C51113_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_05 - AIR FRANCE / KLM|| TPAV|C51113_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_06 - AIR FRANCE / KLM|| TPAV|C51113_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_09 - AIR FRANCE / KLM|| TPAV|C51113_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51113_11 - AIR FRANCE / KLM|| TPAV|C51123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51123_01 - ANA|| TPAV|C51155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51155_01 - BAA BUSINESS SUPPORT CENTRE LTD|| TPAV|C51185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51185_01 - BRISBANE AIRPORT CORPORATION PTY LIMITED|| TPAV|C51612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51612_01 - TAP|| TPAV|C51687_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51687_01 - AAS Schiphol|| TPAV|C51698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51698_01 - KLM|| TPAV|C51913_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51913_01 - Aalborg Lufthavn A.m.b.A:|| TPAV|C51945_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51945_01 - Billund Lufthavn A/S|| TPAV|C51958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51958_01 - Brændstoflageret Københavns Lufthavn I/S|| TPAV|C51540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51540_01 - SAS|| TPAV|C52142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C52142_01 - Københavns Lufthavne A/S|| TPAV|C60206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C60206_01 - Transporte Aéreo S.A.|| TPAV|C70553_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70553_01 - Aeroline Líneas Aéreas Nacionales del Ecuador S.A.|| TPAV|C70574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70574_01 - Lan Airlines S.A.|| TPAV|C70576_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70576_01 - Lan Argentina S.A.|| TPAV|C80252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C80252_01 - Oneworld Management Company, Inc.|| TPAV|C80252_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C80252_02 - Oneworld Management Company, Inc.|| TPAV|C80312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C80312_01 - Airmedic|| TPAV|C80649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C80649_01 - VIRGIN AUSTRALIA AIRLINES PTY LTD|| TPAV|C80779_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C80779_01 - Aldeasa S.A.|| TPAV|C81317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C81317_01 - CivilAviationAuthorityofSingapore|| TPAV|C81451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C81451_01 - Swedavia AB|| TPAV|C10477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10477_01 - Transat Tours|| TPAV|C10477_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10477_02 - Transat Tours|| TPAV|C10477_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10477_03 - Transat Tours|| TPAV|C10477_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10477_04 - Transat Tours|| TPAV|C10477_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10477_05 - Transat Tours|| TPAV|C10526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10526_01 - CATSA - Canadian Air Transport Security Authority|| TPAV|C10646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10646_01 - Air France|| TPAV|C10646_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10646_02 - Air France|| TPAV|C10675_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10675_01 - Denver International Airport|| TPAV|C10815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10815_01 - IATA - International Air Transport Association|| TPAV|C10825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10825_01 - Sydney Airport Corporation|| TPAV|C10867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10867_01 - Aeroports de Montreal|| TPAV|C10885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10885_01 - Sydney Airport|| TPAV|C19999_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C19999_06 - Other Sub Sector TPAV|| TPAV|C50141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C50141_01 - Cargo Zones|| TPAV|C50604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C50604_01 - Spring Air Canada|| TPAV|C70472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70472_01 - SITA|| TPAV|C80443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C80443_01 - Low cost holidays Limited|| TPAV|C10712_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10712_01 - SAS|| TPAV|C10738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10738_01 - SITA|| TPAV|C60184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C60184_01 - ENERJET S.A.|| TPAV|C70645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70645_01 - SITA|| TPAV|C10018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10018_01 - Air Transat|| TPAV|C10018_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10018_02 - Air Transat|| TPAV|C10358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10358_01 - Distributions Alimentaires Le Marquis|| TPAV|C10823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10823_01 - CAMAQ - Comite sectoriel de main-d'oeuvre en aerospatiale|| TPAV|C51151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51151_01 - Aviation|| TPAV|C51210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51210_01 - Conoco JET Nordic AB|| TPAV|C51685_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51685_01 - ADP|| TPAV|C51685_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51685_02 - ADP|| TPAV|C51685_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51685_03 - ADP|| TPAV|C51685_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51685_04 - ADP|| TPAV|C51685_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51685_05 - ADP|| TPAV|C51685_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51685_06 - ADP|| TPAV|C51685_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51685_09 - ADP|| TPAV|C51743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51743_01 - Aviation|| TPAV|C51744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51744_01 - SAS|| TPAV|C51854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C51854_01 - Conoco JET Nordic AB|| TPAV|C60177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C60177_01 - CHOICE AIR COURIER DEL PERU|| TPAV|C70554_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70554_01 - Aeroline Líneas Aéreas Nacionales del Ecuador S.A.|| TPAV|C70555_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70555_01 - Andes Airport Services S.A.|| TPAV|C70564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70564_01 - Fast Air Almacenes de Carga S.A.|| TPAV|C70575_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70575_01 - Lan Airlines S.A.|| TPAV|C70577_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70577_01 - Lan Argentina S.A.|| TPAV|C70578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70578_01 - Lan Cargo S.A.|| TPAV|C70579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70579_01 - Lan Cargo S.A.|| TPAV|C70580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70580_01 - Lan Perú S.A. Sucursal Chile|| TPAV|C70581_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70581_01 - Lantours División Servicios Terrestres S.A.|| TPAV|C70592_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C70592_01 - Transporte Aéreo S.A.|| TPAV|C80963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C80963_01 - ONEWORLD MANAGEMENT COMPANY INC.|| TPAV|C81372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C81372_01 - Eurocontrol|| TPAV|C81567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C81567_01 - GA Columbus CSG|| TPAV|C10675_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C10675_02 - Denver International Airport|| TPAV|C81753_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C81753_01 - Wider?e's Flyveselskap AS|| TPAV|C82122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C82122_01 - Menzies Aviation (Sverige) AB|| TPAV|C82260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C82260_01 - IATA - International Air Transport Association|| TPAV|C82427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C82427_01 - IATA - International Air Transport Association|| TPAV|C82500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C82500_01 - MST|| TPAV|C82567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C82567_01 - Denver International Airport|| TPAV|C83177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C83177_01 - HOBART INTERNATIONAL AIRPORT PTY LTD|| TPAV|C83295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C83295_01 - Targa Systems Division L-3|| TPAV|C83336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C83336_01 - SAS|| TPAV|C83337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPAV_Att|C83337_01 - SAS|| Transportation|TPMT|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TPMT|C10982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10982_01 - GCT Global Container Terminals|| TPMT|C11100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C11100_01 - British Columbia Ferry Services Inc.|| TPMT|C31624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C31624_01 - SMIT|| TPMT|C31726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C31726_01 - Esbjerg Havn|| TPMT|C31734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C31734_01 - Frederikshavn Havn AQ/S|| TPMT|C31737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C31737_01 - Hirtshals Havn|| TPMT|C31777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C31777_01 - Udviklingsselskabet By og Havn I/S|| TPMT|C51324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51324_01 - International Maritime Org.|| TPMT|C51909_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51909_01 - A. P. Møller - Mærsk A/S|| TPMT|C51918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51918_01 - Ærøfærgerne A/S|| TPMT|C51926_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51926_01 - Århus Havn|| TPMT|C51930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51930_01 - Atlas Shipping Ltd.|| TPMT|C51953_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51953_01 - Blokeret *Armada (Singapore) Pte Ltd * Betalingsstandsning|| TPMT|C51969_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51969_01 - Bunker Holding A/S|| TPMT|C52060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52060_01 - ESVAGT A/S|| TPMT|C51547_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51547_01 - Scandlines|| TPMT|C51547_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51547_02 - Scandlines Danmark A/S|| TPMT|C52131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52131_01 - JD-Contractor A/S|| TPMT|C52173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52173_01 - Maersk Container Industry A/S|| TPMT|C52191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52191_01 - Mols-Linien A/S|| TPMT|C52214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52214_01 - Ove Wrist and Co. Ltd. A/S|| TPMT|C52247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52247_01 - Royal Arctic Line A/S|| TPMT|C52292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52292_01 - Svane Shipping A/S|| TPMT|C52311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52311_01 - Unifeeder A/S|| TPMT|C60196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C60196_01 - NEPTUNIA SA|| TPMT|C80857_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C80857_01 - Canal & River Trust|| TPMT|C80416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C80416_01 - PULLMANTUR S.A|| TPMT|C80814_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C80814_01 - IPTM Instituto Portußrio Transportes Mar|| TPMT|C10470_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10470_01 - SLSMC - Saint Lawrence Seaway Management Corporation|| TPMT|C10545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10545_01 - CMA - Compagnie maritime d'affrêtement|| TPMT|C10545_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10545_02 - CMA - Compagnie maritime d'affrêtement|| TPMT|C10545_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10545_03 - CMA - Compagnie maritime daffrêtement|| TPMT|C10545_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10545_04 - CMA - Compagnie maritime daffrêtement|| TPMT|C10704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10704_01 - Port de Montreal|| TPMT|C10704_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10704_03 - Administration portuaire de Montreal|| TPMT|C19999_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C19999_07 - Other Sub Sector TPMT|| TPMT|C10220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10220_01 - Groupe Desgagnés Inc.|| TPMT|C10725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C10725_01 - Societe Terminaux Montreal Gateway|| TPMT|C51834_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C51834_01 - Scandlines|| TPMT|C52278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C52278_01 - Smyril Line|| TPMT|C81198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81198_01 - Hamburg Südamerikanische|| TPMT|C81702_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81702_01 - C81702_01 - Scandferries Holding GmbH|| TPMT|C81626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81626_01 - Scandferries Holding GmbH|| TPMT|C81642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81642_01 - Schultz Shipping A/S|| TPMT|C81653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81653_01 - Danpilot - Lodseriet Danmark|| TPMT|C81748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81748_01 - Administration portuaire de Qu?bec|| TPMT|C81810_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81810_01 - Rijkswaterstaat|| TPMT|C81844_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C81844_01 - SOC.TRAVERSIERS|| TPMT|C82087_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82087_01 - APM Terminals Gothenburg AB|| TPMT|C82401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82401_01 - Sh�h�razade|| TPMT|C82474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82474_01 - Kvarkenhamnar AB|| TPMT|C82497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82497_01 - Loodswezen|| TPMT|C82821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82821_01 - Kloska Management GmbH|| TPMT|C82823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82823_01 - ASK Kloska GmbH|| TPMT|C82825_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82825_01 - Bast� & Lange GmbH|| TPMT|C82990_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C82990_01 - WICET|| TPMT|C83178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C83178_01 - SPIRIT OF TASMANIA|| TPMT|C83189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C83189_01 - Stena Line Scandinavia AB|| TPMT|C11193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C11193_01 - A�roport international Jean-Lesage de Qu�bec|| TPMT|C83341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C83341_01 - Stena|| TPMT|C84217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPMT_Att|C84217_01 - TASPORTS|| Transportation|TPRL|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TPRL|C81800_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C81800_01 - Prorail|| TPRL|C10020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C10020_01 - Genesee & Wyoming Canada Inc.|| TPRL|C11007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C11007_01 - ExPretio|| TPRL|C11147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C11147_01 - Network Rail Infrastructure Ltd|| TPRL|C11181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C11181_01 - ASCIANO EXECUTIVE SERVICES PTY LTD|| TPRL|C51215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51215_01 - CP|| TPRL|C51232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51232_01 - Deutsche Bahn AG und Tochter|| TPRL|C51238_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51238_01 - DOWNER EDI RAIL PTY LTD|| TPRL|C51424_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51424_01 - Network Rail Infrastructure Ltd|| TPRL|C51425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51425_01 - NMBS|| TPRL|C51157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51157_01 - Banedanmark|| TPRL|C51573_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_11 - SNCF|| TPRL|C51573_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_12 - SNCF|| TPRL|C51672_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51672_01 - VR Group(23921|| TPRL|C51678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51678_01 - YARRA TRAMS|| TPRL|C51701_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51701_01 - NS|| TPRL|C52035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C52035_01 - DSB Sverige AB|| TPRL|C51475_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51475_01 - PACIFIC NATIONAL PTY LTD|| TPRL|C51505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51505_01 - RAILCORP (Supplier No 001386)|| TPRL|C51568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51568_01 - SJ|| TPRL|C51573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_01 - SNCF|| TPRL|C51573_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_02 - SNCF|| TPRL|C51573_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_03 - SNCF|| TPRL|C51573_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_04 - SNCF|| TPRL|C51573_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_05 - SNCF|| TPRL|C51573_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_06 - SNCF|| TPRL|C51573_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_07 - SNCF|| TPRL|C51573_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_09 - SNCF|| TPRL|C70453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C70453_01 - QUEENSLAND RAIL(Vendor No. 42587)|| TPRL|C80543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C80543_01 - Heathrow_Express|| TPRL|C80565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C80565_01 - Merseytravel|| TPRL|C80578_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C80578_01 - Orient_Express|| TPRL|C81312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C81312_01 - VIARailCanadaInc.|| TPRL|C10697_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C10697_01 - VIA Rail Canada Inc|| TPRL|C10090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C10090_01 - CN - Canadian National Railways|| TPRL|C10090_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C10090_02 - CN - Canadian National Railways|| TPRL|C10133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C10133_01 - CP - Canadian Pacific Railway|| TPRL|C10248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C10248_01 - Ferronor S.A.|| TPRL|C19999_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C19999_08 - Other Sub Sector TPRL|| TPRL|C81509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C81509_01 - Sydney Trains|| TPRL|C51430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51430_01 - NORDWAGGON|| TPRL|C51843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51843_01 - SJ|| TPRL|C51936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51936_01 - Banedanmark|| TPRL|C10791_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C10791_01 - DB Services|| TPRL|C81878_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C81878_01 - Infrabel|| TPRL|C82469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C82469_01 - CN Railway|| TPRL|C82832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C82832_01 - KEOLISDOWNER|| TPRL|C83139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C83139_01 - Kansas City, MO|| TPRL|C83176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C83176_01 - PACIFIC NATIONAL PTY LTD|| TPRL|C83291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C83291_01 - SNCF|| TPRL|C51573_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C51573_13 - SNCF|| TPRL|C83433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C83433_01 - SNCF|| Transportation|TPRR|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TPRR|C10015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10015_01 - AMT - Agence metropolitaine de transport|| TPRR|C11000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C11000_01 - TransLink|| TPRR|C11116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C11116_01 - Dept. of Transport|| TPRR|C19999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C19999_02 - Other Sub Sector RDTR (old sub-sector)|| TPRR|C30020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30020_01 - Alberta - Infrastructure and Transportation|| TPRR|C30083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30083_01 - Commission des transports du Québec|| TPRR|C30083_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30083_02 - Commission des transports du Québec|| TPRR|C30110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30110_01 - EAS - NYC - Transit authority|| TPRR|C30143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30143_01 - Indiana Dept of Transportation|| TPRR|C30614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30614_01 - CA - Department of transportation|| TPRR|C30614_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30614_02 - CA - Department of transportation|| TPRR|C30614_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30614_03 - CA - Department of transportation|| TPRR|C30859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30859_01 - BC - Ministry of transportation|| TPRR|C30226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30226_01 - NYS Thruway Authority|| TPRR|C30318_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30318_02 - Travel Alberta|| TPRR|C30318_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30318_03 - Travel Alberta|| TPRR|C30388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30388_01 - ID Dept of Transportation|| TPRR|C31496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31496_01 - Luftfartsverket|| TPRR|C30975_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30975_01 - VA Dept of Transportation|| TPRR|C30975_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C30975_02 - VA Dept of Transportation|| TPRR|C31032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31032_01 - CalTrans|| TPRR|C31032_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31032_02 - CalTrans|| TPRR|C31090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31090_01 - US Department of Transportation|| TPRR|C31148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31148_01 - MA Dept of Transportation|| TPRR|C31306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31306_01 - CAN/ON - Min of Transportation|| TPRR|C31601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31601_01 - ROADS AND MARITIME SERVICES|| TPRR|C31648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31648_01 - Trafikverket|| TPRR|C31699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31699_01 - DEPARTMENT OF PLANNING, TRANSPORT &  INFRASTRUCTURE SA|| TPRR|C51292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51292_01 - Greater Manchester Passenger Transport Executive|| TPRR|C51345_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51345_01 - Kapsch|| TPRR|C51398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51398_01 - Metropolitano de Lisboa|| TPRR|C51135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51135_01 - ASCENDI|| TPRR|C51184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51184_01 - BRISA|| TPRR|C51596_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51596_01 - Suomen Kaukokiito Oy|| TPRR|C51614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51614_01 - Taxi Stockholm|| TPRR|C51640_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51640_01 - Trans4M|| TPRR|C51642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51642_01 - Transport & Logistics|| TPRR|C51643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51643_01 - Transport Scotland|| TPRR|C51644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51644_01 - TRANSURBAN LTD (Vendor No 131115)|| TPRR|C51662_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51662_01 - Veolia Transport|| TPRR|C51700_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51700_01 - MIT Other|| TPRR|C52065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C52065_01 - Femern B��lt A/S|| TPRR|C51463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_01 - OTHERS - TRANSPORT|| TPRR|C51463_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_02 - OTHERS - TRANSPORT|| TPRR|C51463_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_03 - OTHERS - TRANSPORT|| TPRR|C51463_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_04 - OTHERS - TRANSPORT|| TPRR|C51463_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_05 - OTHERS - TRANSPORT|| TPRR|C51463_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_06 - OTHERS - TRANSPORT|| TPRR|C51463_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_09 - OTHERS - TRANSPORT|| TPRR|C51463_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_11 - OTHERS - TRANSPORT|| TPRR|C51463_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51463_12 - OTHERS - TRANSPORT|| TPRR|C51509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_01 - RATP|| TPRR|C51509_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_02 - RATP|| TPRR|C51509_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_03 - RATP|| TPRR|C51509_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_04 - RATP|| TPRR|C51509_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_05 - RATP|| TPRR|C51509_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_06 - RATP|| TPRR|C51509_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_09 - RATP|| TPRR|C51509_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51509_11 - RATP|| TPRR|C51572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51572_01 - SL - Storstockholms Lokaltrafik|| TPRR|C52243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C52243_01 - Resekortet i Norden AB|| TPRR|C52319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C52319_01 - Vectura Consulting|| TPRR|C52322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C52322_01 - Viborg Turisttrafik|| TPRR|C60323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C60323_01 - PACIFIC WESTERN TRANSPORTATION|| TPRR|C70572_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C70572_01 - Itinere Chile S.A.|| TPRR|C70469_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C70469_01 - Schweiz Post|| TPRR|C80840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80840_01 - First Group|| TPRR|C80277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80277_01 - TRANSPORT NSW|| TPRR|C80310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80310_01 - INECO S.A.|| TPRR|C80533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80533_01 - Ferrovial|| TPRR|C80560_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80560_01 - London_United_Busways|| TPRR|C80601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80601_01 - Transdev|| TPRR|C80602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80602_01 - Transport_for_Greater_Manchester|| TPRR|C80680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80680_01 - Indiana Toll Road Concession Company|| TPRR|C81282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81282_01 - LesPontsJacquesCartieretChamplainIncorporee|| TPRR|C10399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10399_01 - RTC - Réseau de transport de la Capitale|| TPRR|C10399_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10399_02 - RTC - Réseau de transport de la Capitale|| TPRR|C10652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10652_01 - RATP - Régie autonome des transports parisiens|| TPRR|C10652_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10652_02 - RATP - Régie autonome des transports parisiens|| TPRR|C10652_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10652_03 - RATP - Régie autonome des transports parisiens|| TPRR|C10652_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10652_04 - RATP - Régie autonome des transports parisiens|| TPRR|C10713_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10713_01 - Transport Canada|| TPRR|C10744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10744_01 - STM - Societe de transport de Montreal|| TPRR|C10744_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10744_02 - STM - Société de transport de Montréal|| TPRR|C10744_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10744_03 - STM - Société de transport de Montréal|| TPRR|C10744_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10744_04 - STM - Societe de transport de Montreal|| TPRR|C10793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10793_01 - STL - Societe de transport de Laval|| TPRR|C10793_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10793_02 - STL - Société de transport de Laval|| TPRR|C10854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10854_01 - Ferrovial|| TPRR|C19999_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C19999_09 - Other Sub Sector TPRR|| TPRR|C81407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81407_01 - Národná dialnicná spolocnost, a.s.|| TPRR|C50163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C50163_01 - Col Sel Transit Inc.|| TPRR|C60249_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C60249_01 - Luftfartsverket|| TPRR|C10462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10462_01 - Technology Support Center Inc.|| TPRR|C10011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10011_01 - Aveos Fleet Performance Inc.|| TPRR|C10011_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10011_03 - Aveos Fleet Performance Inc.|| TPRR|C60263_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C60263_01 - Trafikverket|| TPRR|C10011_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10011_04 - Aveos Fleet Performance Inc.|| TPRR|C10011_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10011_05 - Aveos Fleet Performance Inc.|| TPRR|C10054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10054_01 - Autobus Laterriere Inc.|| TPRR|C10109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10109_01 - Coast Mountain Bus Company|| TPRR|C10400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10400_01 - RTL - Réseau de transport de Longueuil|| TPRR|C10400_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10400_02 - RTL - Reseau de transport de Longueuil|| TPRR|C10594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10594_01 - CMA CGM|| TPRR|C10594_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10594_02 - CMA CGM|| TPRR|C10863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10863_01 - FFA - Fédération francaise aéronautique|| TPRR|C10938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C10938_01 - Autocars Orléans Express|| TPRR|C11072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C11072_01 - Pacific Western Corporate Group|| TPRR|C51206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51206_01 - Colegios Fomento|| TPRR|C51250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51250_01 - ELOG|| TPRR|C51645_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51645_01 - Travel|| TPRR|C51838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51838_01 - Taxi Stockholm|| TPRR|C51841_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51841_01 - Veolia Transport|| TPRR|C51856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51856_01 - ELOG|| TPRR|C51885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51885_01 - SL - Storstockholms Lokaltrafik|| TPRR|C70567_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C70567_01 - Gestión Vial S.A.|| TPRR|C70573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C70573_01 - Itinere Chile S.A.|| TPRR|C81365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81365_01 - Cabo Verde|| TPRR|C80346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C80346_01 - Transport for Greater Manchester|| TPRR|C51198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51198_01 - CENTRO|| TPRR|C51490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51490_01 - PORTVIAS|| TPRR|C51663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C51663_01 - VIALIVRE|| TPRR|C81580_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81580_01 - R.T.C|| TPRR|C81625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81625_01 - DFDS A/S|| TPRR|C81778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81778_01 - Bring Cargo AS|| TPRR|C81847_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81847_01 - GROUPE ORLEANS|| TPRR|C81859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81859_01 - Highways Agency|| TPRR|C81860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81860_01 - Highways Agency|| TPRR|C81871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81871_01 - CAN - Association des transports du Canada|| TPRR|C81889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C81889_01 - Mullen Group Ltd|| TPRR|C81932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRL_Att|C81932_01 - New York Metropolitan Transit Authority|| TPRR|C31306_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31306_02 - CAN/ON - Min of Transportation|| TPRR|C31306_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C31306_03 - CAN/ON - Min of Transportation|| TPRR|C82024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82024_01 - Merseytravel|| TPRR|C82159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82159_01 - NY State Thruway|| TPRR|C82222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82222_01 - Oy Matkahuolto Ab|| TPRR|C82486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82486_01 - Keolis|| TPRR|C82550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82550_01 - Public Transport Victoria|| TPRR|C82574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82574_01 - American Honda Motor Company|| TPRR|C82630_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82630_01 - NY State Thruway|| TPRR|C82769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C82769_01 - Kapsch TrafficCom AG|| TPRR|C83047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83047_01 - Trafik- og Byggestyrelsen|| TPRR|C83127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83127_01 - KDR GOLD COAST PTY LTD (ACN 150 236 936)|| TPRR|C83137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83137_01 - Canadian Consulate General, Atlanta|| TPRR|C83266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83266_01 - NV - Dept of Transportation|| TPRR|C83267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83267_01 - Department for Work and Pensions|| TPRR|C83426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83426_01 - Toll Collect GmbH|| TPRR|C83444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83444_01 - STAC - Service de transport adapt? de la Capitale|| TPRR|C83467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83467_01 - MTR CORPORATION (SYDNEY) NRT PTY LIMITED|| TPRR|C83518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83518_01 - Massachusetts Bay Transportation Authori|| TPRR|C83557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83557_01 - OR - Dept of Transportation|| TPRR|C83570_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83570_01 - V?sttrafik AB|| TPRR|C83617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83617_01 - South Coast BC Transportation Authority (SCBCTA)|| TPRR|C83681_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83681_01 - Dopravni podnik hl.m.Prahy a.s.|| TPRR|C83725_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83725_01 - American Honda Motor Company|| TPRR|C83924_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C83924_01 - INDIANA DEPT OF TRANSPORTATION|| TPRR|C84388_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TPRR_Att|C84388_01 - Washington State Dept of Transportation|| MRD|Post_and_Logistics|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Post and Logistics|| Post_and_Logistics|PLPC|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| PLPC|C19999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C19999_01 - Other Sub Sector RDPS (old sub-sector)|| PLPC|C51233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51233_01 - Deutsche Post AG|| PLPC|C51234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51234_01 - DHL|| PLPC|C51330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51330_01 - Itella Oyj|| PLPC|C51363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_01 - LA POSTE|| PLPC|C51363_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_02 - LA POSTE|| PLPC|C51363_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_03 - LA POSTE|| PLPC|C51363_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_04 - LA POSTE|| PLPC|C51363_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_05 - LA POSTE|| PLPC|C51363_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_06 - LA POSTE|| PLPC|C51363_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_09 - LA POSTE|| PLPC|C51363_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51363_12 - LA POSTE|| PLPC|C51182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51182_01 - bPOST|| PLPC|C51635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51635_01 - TNT|| PLPC|C51691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51691_01 - Deutsche Post NL|| PLPC|C51704_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51704_01 - PostNL Group|| PLPC|C51833_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51833_01 - PostNord|| PLPC|C52033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C52033_01 - DHL Express A/S|| PLPC|C51491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51491_01 - Post office ltd|| PLPC|C51492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51492_01 - Posten|| PLPC|C51493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51493_01 - Posten Norden AB|| PLPC|C70285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C70285_01 - Direct Costs|| PLPC|C60176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C60176_01 - Chilexpress S.A|| PLPC|C80403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C80403_01 - Correos y Telégrafos de España S.A.|| PLPC|C80673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C80673_01 - Poczta Polska Uslugi Cyfrowe Sp. z o.o.|| PLPC|C80820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C80820_01 - Correos y Telégrafos de España S.A.|| PLPC|C81199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C81199_01 - SWISS POST SOLUTIONS LTD|| PLPC|C81199_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C81199_02 - SWISS POST SOLUTIONS LTD|| PLPC|C10382_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10382_01 - Purolator|| PLPC|C10382_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10382_02 - Purolator|| PLPC|C10382_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10382_03 - Purolator ITM Toronto|| PLPC|C10382_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10382_04 - Purolator|| PLPC|C10382_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10382_06 - Purolator|| PLPC|C10397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_01 - Poste Canada|| PLPC|C10397_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_03 - CPC - Canada Post Corporation|| PLPC|C10397_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_04 - CPC - Canada Post Corporation|| PLPC|C10397_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_05 - CPC - Canada Post Corporation (GIDA)|| PLPC|C10397_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_08 - CPC - Canada Post Corporation (ITM - Montreal)|| PLPC|C10397_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_09 - CPC - Canada Post Corporation (ITM Toronto 1)|| PLPC|C10397_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_10 - CPC - Canada Post Corporation (ITM Toronto 2)|| PLPC|C10397_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_11 - Canada Post Group of Companies|| PLPC|C10397_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_12 - Poste Canada|| PLPC|C10397_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_13 - CPC - Canada Post Corporation (T1)|| PLPC|C10397_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_14 - CPC - Canada Post Corporation (T3)|| PLPC|C10397_15|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10397_15 - Canada Post Corporation|| PLPC|C10569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10569_01 - Kopel Inc.|| PLPC|C10696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10696_01 - La Poste|| PLPC|C10803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10803_01 - Messageries Dynamiques|| PLPC|C10803_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10803_03 - Messageries Dynamiques|| PLPC|C10247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_01 - Innovapost|| PLPC|C10247_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_03 - Innovapost|| PLPC|C10247_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_04 - Innovapost|| PLPC|C10247_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_05 - Innovapost|| PLPC|C10247_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_06 - Innovapost|| PLPC|C10247_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_07 - Innovapost|| PLPC|C10247_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_08 - Innovapost ITM Montreal|| PLPC|C10247_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_09 - Innovapost Ottawa|| PLPC|C10247_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_10 - Innovapost|| PLPC|C10247_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10247_11 - Innovapost|| PLPC|C19999_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C19999_10 - Other Sub Sector PLPC|| PLPC|C51829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51829_01 - DHL|| PLPC|C51840_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C51840_01 - TNT|| PLPC|C81827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C81827_01 - DHL|| PLPC|C81898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C81898_01 - Posten|| PLPC|C10382_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C10382_07 - Purolator Courier Limited|| PLPC|C81977_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C81977_01 - DYNAMEX CANADA LIMITED|| PLPC|C82092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C82092_01 - 21 Grams AB|| PLPC|C82252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C82252_01 - South African Post Office Ltd|| PLPC|C82842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C82842_01 - Canada Post Corporation|| PLPC|C83165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C83165_01 - Bring Mail Nordic AB|| PLPC|C83201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C83201_01 - Lernia AB|| PLPC|C83231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C83231_01 - EMR Settlement Limited|| PLPC|C83273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C83273_01 - CATS MANAGEMENT LIMITED|| PLPC|C83610_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLPC_Att|C83610_01 - INTERMEC TECHNOLOGIES AUSTRALIA PTY LTD|| Post_and_Logistics|PLLO|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| PLLO|C19999_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C19999_11 - Other Sub Sector PLLO|| PLLO|C10997_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10997_01 - Livingston International|| PLLO|C10997_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10997_02 - Livingston International|| PLLO|C11021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C11021_01 - Trimac Transportation|| PLLO|C11021_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C11021_02 - Trimac Transportation|| PLLO|C11021_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C11021_03 - Trimac Management Services Limited Partn|| PLLO|C51227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51227_01 - Danske Fragtmænd A/S|| PLLO|C51278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51278_01 - Fredericia Shipping|| PLLO|C51293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51293_01 - Green Cargo|| PLLO|C51371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51371_01 - Lexzau, Scharbau|| PLLO|C51381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51381_01 - Luis Simoes|| PLLO|C51384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51384_01 - Mail, Express & Logistics|| PLLO|C51673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51673_01 - VSD Logistics|| PLLO|C51674_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51674_01 - VTG-Lehnkering AG|| PLLO|C51699_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51699_01 - Other Transport|| PLLO|C51910_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51910_01 - A/S Dan-Bunkering Ltd|| PLLO|C51911_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51911_01 - A/S Skræps Vognmandsforretning af 1927|| PLLO|C51923_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51923_01 - Alex Andersen, Ølund A/S|| PLLO|C51978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51978_01 - Cargo Service Holding A/S|| PLLO|C52066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C52066_01 - FISKELOGISTIK GRUPPEN A/S|| PLLO|C52069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C52069_01 - Fragtmænd Holding A/S|| PLLO|C51549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51549_01 - Schenker|| PLLO|C51564_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51564_01 - SILK LOGISTICS GROUP PTY LTD|| PLLO|C52156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C52156_01 - Leman-International System Transport A/S|| PLLO|C52305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C52305_01 - Trans Mar A/S|| PLLO|C52334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C52334_01 - BIS INDUSTRIES LIMITED|| PLLO|C80308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C80308_01 - TRANSFESA|| PLLO|C80339_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C80339_01 - Transporte 77 S.A.|| PLLO|C10512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10512_01 - Weyburn Inland Terminal Ltd|| PLLO|C10862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10862_01 - EB Trans|| PLLO|C10870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10870_01 - TransForce Inc.|| PLLO|C10912_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10912_01 - IMTT-Québec|| PLLO|C10919_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10919_01 - Kelron Logistics|| PLLO|C10751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10751_01 - Prosegur|| PLLO|C81521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C81521_01 - ASL Distribution Services Limited|| PLLO|C81521_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C81521_02 - ASL Distribution Services Limited|| PLLO|C10568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10568_01 - Cobham Tracking and Locating Ltd|| PLLO|C10147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10147_01 - DataTrail Inc.|| PLLO|C10334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10334_01 - Nadiscorp Logistics Group Inc.|| PLLO|C10334_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10334_02 - Nadiscorp Logistics Group Inc.|| PLLO|C11006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C11006_01 - Livingston International Inc.|| PLLO|C51842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51842_01 - VSD Logistics|| PLLO|C10216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10216_01 - Groupe CDP|| PLLO|C10300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10300_01 - Maersk|| PLLO|C10786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10786_01 - Mackie Group|| PLLO|C51410_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51410_01 - MTAB|| PLLO|C51539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51539_01 - Sapphire|| PLLO|C51830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51830_01 - Green Cargo|| PLLO|C51831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51831_01 - Mail, Express & Logistics|| PLLO|C51832_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51832_01 - MTAB|| PLLO|C51835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C51835_01 - Schenker|| PLLO|C60201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C60201_01 - Panalpina|| PLLO|C60209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C60209_01 - YRC LOGISTICS INC. S.R.L.|| PLLO|C10870_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10870_02 - TransForce Inc.|| PLLO|C10997_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C10997_03 - Livingston-US743|| PLLO|C81828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C81828_01 - Other Logistics|| PLLO|C81978_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C81978_01 - QUIK X TRANSPORTATION|| PLLO|C81545_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C81545_01 - Hamburg Sud|| PLLO|C81197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C81197_01 - Hamburg|| PLLO|C83092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C83092_01 - DPD (BELGIUM) NV|| PLLO|C83349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C83349_01 - Republic Parking Systems|| PLLO|C83430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PLLO_Att|C83430_01 - DHL International (Belgium) N.V|| Sectors|Telecom_and_Utilities|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Telecom_and_Utilities|Communications|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Communications|| Communications|TTTE|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TTTE|C11123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C11123_01 - GC Pan European Crossing Ltd|| TTTE|C11166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C11166_01 - Telefonica UK Limited|| TTTE|C11177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C11177_01 - B.T.|| TTTE|C22099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C22099_01 - Next Gen M&S 2011-2012|| TTTE|C22100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C22100_01 - Next Gen M&S 2012-2013|| TTTE|C22101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C22101_01 - Next Gen Product Sales|| TTTE|C30578_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C30578_03 - FederalCommunicationsCommission(FCC)|| TTTE|C31411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31411_01 - Etihad Entisalat Company|| TTTE|C31557_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31557_01 - OFCOM|| TTTE|C40243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C40243_01 - B.T.|| TTTE|C31579_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31579_01 - Paradigm Secure Communications|| TTTE|C31584_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31584_01 - Positioneering Ltd|| TTTE|C31588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31588_01 - PSMA AUSTRALIA LIMITED|| TTTE|C31588_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31588_02 - PSMA AUSTRALIA LIMITED|| TTTE|C31642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31642_01 - Telecom Egypt|| TTTE|C31643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C31643_01 - TELECOMMUNICATIONS|| TTTE|C51407_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51407_01 - Motorola Solutions CZ|| TTTE|C51428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51428_01 - Nordisk Film|| TTTE|C51429_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51429_01 - Nordisk Film A/S|| TTTE|C51619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51619_01 - Teleste Oyj|| TTTE|C52046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C52046_01 - Egmont Administrationen A/S|| TTTE|C52047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C52047_01 - Egmont International Holding A/S|| TTTE|C52083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C52083_01 - GlobalConnect A/S|| TTTE|C51513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51513_01 - Relacom AS|| TTTE|C51516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51516_01 - Renesas Mobile Europe Oy|| TTTE|C70025_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70025_02 - Qwest|| TTTE|C70025_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70025_03 - Qwest|| TTTE|C70025_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70025_04 - Qwest|| TTTE|C70026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70026_01 - Sasktel|| TTTE|C70026_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70026_02 - Sasktel|| TTTE|C70030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70030_01 - Télébec Ltée|| TTTE|C70031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70031_01 - Teleglobe Canada (TATA Communications)|| TTTE|C70033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70033_01 - Tele-Plus Management Inc.|| TTTE|C70035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70035_01 - Telstra|| TTTE|C70035_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70035_02 - Telstra|| TTTE|C70035_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70035_03 - Telstra|| TTTE|C70035_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70035_04 - Telstra|| TTTE|C70037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_01 - Telus Communication|| TTTE|C70037_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_02 - Telus Communication|| TTTE|C70037_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_03 - Telus Communication|| TTTE|C70037_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_04 - Telus Communication|| TTTE|C70037_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_05 - Telus Communication|| TTTE|C70037_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_06 - Telus Communication|| TTTE|C70037_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_07 - Telus Communications (Quebec) Inc|| TTTE|C70040_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70040_03 - T-Mobile Polska S.A.|| TTTE|C70041_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70041_01 - Verizon Wireless|| TTTE|C70041_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70041_02 - Verizon Wireless|| TTTE|C70041_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70041_03 - Verizon Wireless|| TTTE|C70041_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70041_04 - Verizon Wireless|| TTTE|C70041_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70041_05 - Verizon Wireless|| TTTE|C70042_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70042_03 - Videotron Ltee|| TTTE|C70042_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70042_04 - Vidéotron Ltée|| TTTE|C70042_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70042_05 - Videotron Ltee|| TTTE|C70043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70043_01 - Volt Delta Resources|| TTTE|C70048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70048_01 - Service Entity|| TTTE|C70050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70050_01 - Sunrise|| TTTE|C70051_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70051_01 - Embarq Management Company|| TTTE|C70051_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70051_02 - Embarq Management Company|| TTTE|C70051_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70051_03 - Embarq Management Company|| TTTE|C70053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70053_01 - Tele 2|| TTTE|C70055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70055_01 - Telfort|| TTTE|C70055_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70055_02 - Telfort - Headquarters|| TTTE|C70055_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70055_03 - Telfort - Headquarters|| TTTE|C70055_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70055_04 - Telfort|| TTTE|C70060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70060_01 - T-Mobile|| TTTE|C70061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70061_01 - TV Cabo|| TTTE|C70074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_04 - Vodafone Hutchison Australia|| TTTE|C70074_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_02 - Vodafone - Spain|| TTTE|C70074_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_03 - Vodafone - D2|| TTTE|C70074_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_04 - Vodafone|| TTTE|C70074_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_05 - Vodafone - Portugal|| TTTE|C70074_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_08 - Vodafone Omnitel-Italy|| TTTE|C70074_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_09 - Vodafone Italia|| TTTE|C70074_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_10 - Vodafone Group Germany|| TTTE|C70074_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_11 - Vodafone|| TTTE|C70074_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_12 - Vodafone|| TTTE|C70074_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_13 - Vodafone|| TTTE|C70074_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_14 - Vodafone Procurement Company S.a.r.l|| TTTE|C70074_15|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_15 - Vodafone Limited|| TTTE|C70074_16|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70074_16 - Vodafone Global|| TTTE|C70076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70076_01 - BMB Electronics Group|| TTTE|C70085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_01 - IBM Spain|| TTTE|C70085_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_02 - IBM Portugal|| TTTE|C70085_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_03 - IBM Canada Ltd|| TTTE|C70085_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_04 - IBM|| TTTE|C70085_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_06 - IBM Italy|| TTTE|C70085_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_07 - IBM|| TTTE|C70085_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_08 - IBM|| TTTE|C70085_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_11 - IBM|| TTTE|C70085_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_12 - IBM|| TTTE|C70089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70089_01 - Teradata|| TTTE|C70091_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70091_01 - Cable R|| TTTE|C70093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70093_01 - Xfera|| TTTE|C70096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70096_01 - PT Comunicações|| TTTE|C70101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70101_01 - Metro|| TTTE|C70103_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70103_01 - Empolis / Arvato|| TTTE|C70105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70105_01 - HDI|| TTTE|C70112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70112_01 - O2 - Germany|| TTTE|C70112_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70112_02 - O2 - Germany|| TTTE|C70112_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70112_03 - O2 - Germany|| TTTE|C70113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70113_01 - Arcor|| TTTE|C70116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70116_01 - Casema / Zesko|| TTTE|C70118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70118_01 - Polkomtel|| TTTE|C70118_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70118_02 - Polkomtel|| TTTE|C70118_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70118_03 - Polkomtel|| TTTE|C70118_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70118_04 - Polkomtel|| TTTE|C70119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70119_01 - France Telecom|| TTTE|C70119_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70119_02 - France Telecom|| TTTE|C70119_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70119_03 - France Telecom|| TTTE|C70119_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70119_04 - France Telecom|| TTTE|C70120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70120_01 - Bouygues-Tel|| TTTE|C70120_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70120_02 - Bouygues-Tel|| TTTE|C70122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70122_01 - SFR|| TTTE|C70122_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70122_02 - SFR|| TTTE|C70122_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70122_03 - SFR|| TTTE|C70124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70124_01 - Connecta 5 Telecinco|| TTTE|C70125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70125_01 - Cable Wireless Ltd|| TTTE|C70126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70126_01 - Embratel|| TTTE|C70126_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70126_02 - Embratel|| TTTE|C70126_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70126_03 - Embratel|| TTTE|C70127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70127_01 - Rogers Communications|| TTTE|C70127_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70127_02 - Rogers Communications|| TTTE|C70128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70128_01 - Amdocs Canada Managed Services Inc.|| TTTE|C70129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70129_01 - Belgacom Mobile|| TTTE|C70129_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70129_02 - Belgacom Mobile|| TTTE|C70129_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70129_03 - Belgacom Mobile|| TTTE|C70132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70132_01 - Cox Communications|| TTTE|C70142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70142_01 - T-Online|| TTTE|C70146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70146_01 - Fairpoint|| TTTE|C70149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70149_01 - E-Plus Movile|| TTTE|C70149_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70149_02 - E-Plus Mobilfunk|| TTTE|C70150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70150_01 - Deutsche Telekom|| TTTE|C70150_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70150_02 - Deutsche Telekom|| TTTE|C70151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70151_01 - Telenet|| TTTE|C70152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70152_01 - Ziggo|| TTTE|C70158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70158_01 - DirectTv|| TTTE|C70158_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70158_03 - DirectTv|| TTTE|C70158_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70158_04 - DirectTv|| TTTE|C70158_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70158_05 - DirectTv|| TTTE|C70159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_01 - H3G|| TTTE|C70159_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_02 - H3G|| TTTE|C70159_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_03 - H3G Italy|| TTTE|C70159_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_04 - H3G Austria GmbH|| TTTE|C70159_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_05 - H3G Italy|| TTTE|C70159_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_06 - H3G Italy|| TTTE|C70159_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_07 - H3G|| TTTE|C70159_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70159_08 - H3G|| TTTE|C70160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70160_01 - Shaw Cables Systems|| TTTE|C70160_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70160_02 - Shaw Cables Systems|| TTTE|C70160_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70160_03 - Shaw Communications Inc.|| TTTE|C70161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70161_01 - EDS - Electronic Data Systems|| TTTE|C70162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70162_01 - IECI - Informatica El Corte Inglés|| TTTE|C70164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70164_01 - Zon Multimedia|| TTTE|C70165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70165_01 - British Telecom|| TTTE|C70165_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70165_02 - British Telecom|| TTTE|C70166_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70166_01 - Infosat Communications|| TTTE|C70167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70167_01 - Sigma|| TTTE|C70167_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70167_02 - Sigma|| TTTE|C70168_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70168_01 - CBC Radio-Canada|| TTTE|C70169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70169_01 - Network Innovations Satellite Communications|| TTTE|C70171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70171_01 - Juniper Networks|| TTTE|C70174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70174_01 - Gestevision Tele5|| TTTE|C70176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70176_01 - BT Global Services Account|| TTTE|C70176_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70176_02 - BT Global Services (Espana)|| TTTE|C70176_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70176_03 - BT Global Services (Espana)|| TTTE|C70177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70177_01 - Salveo|| TTTE|C70178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70178_01 - Ericsson Network Services Italy|| TTTE|C70179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70179_01 - Vizzavi|| TTTE|C70182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70182_01 - Netia|| TTTE|C70182_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70182_02 - Netia|| TTTE|C70183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70183_01 - Met Office|| TTTE|C70184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70184_01 - Accenture|| TTTE|C70185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70185_01 - Vodacom|| TTTE|C70187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70187_01 - Cingular Wireless|| TTTE|C70187_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70187_02 - Cingular Wireless|| TTTE|C70188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70188_01 - Capgemini|| TTTE|C70188_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70188_02 - Capgemini|| TTTE|C70188_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70188_03 - Capgemini Canada Inc.|| TTTE|C70188_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70188_04 - CapGemini Spain|| TTTE|C70188_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70188_05 - Capgemini UK plc|| TTTE|C70189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70189_01 - TPSA - Telekomunikacja Polska|| TTTE|C70190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70190_01 - Skynet I-Motion Activities|| TTTE|C70191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70191_01 - Telesat Inc.|| TTTE|C70192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70192_01 - Soleo Communications Inc.|| TTTE|C70193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70193_01 - Pelmorex Communications Inc.|| TTTE|C70194_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70194_01 - Exfo|| TTTE|C70195_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70195_01 - Polska Telefonia Komorkowa Centertel|| TTTE|C70196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70196_01 - Tele2 Deutschland|| TTTE|C70197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70197_01 - Atos Origin|| TTTE|C70197_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70197_02 - Atos Origin|| TTTE|C70197_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70197_03 - Atos Origin|| TTTE|C70198_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70198_01 - 1 and 1 Internet|| TTTE|C70199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70199_01 - BASE - Basel Agency for Sustainable Energy|| TTTE|C70199_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70199_02 - BASE - Basel Agency for Sustainable Energy|| TTTE|C70200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70200_01 - Unidad Editorial|| TTTE|C70201_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70201_01 - Telefonica de Espana|| TTTE|C70202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70202_01 - Solera Networks|| TTTE|C70203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70203_01 - Sandvine Corporation|| TTTE|C70204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70204_01 - Cable Television Laboratories Inc.|| TTTE|C70205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70205_01 - Fonex|| TTTE|C70206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70206_01 - Chunghwa Telecom|| TTTE|C70208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70208_01 - Red Bull Media House GmbH|| TTTE|C70209_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70209_01 - Swisscom AG|| TTTE|C70210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70210_01 - Softinsa|| TTTE|C70211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70211_01 - Telefónica Germany|| TTTE|C70212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70212_01 - Sogecuatro|| TTTE|C70213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70213_01 - Conecta5|| TTTE|C70214_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70214_01 - Mediaset España Comunicaciòn|| TTTE|C70215_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70215_01 - Bell TV|| TTTE|C70216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70216_01 - PTC - Polska Telefonia Cyfrowa|| TTTE|C70217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70217_01 - Oracle Software|| TTTE|C70217_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70217_02 - Oracle Corporation|| TTTE|C70217_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70217_03 - Oracle Corporation Canada Inc.|| TTTE|C70217_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70217_04 - ORACLE CORPORATION UK LIMITED|| TTTE|C70217_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70217_05 - ORACLE|| TTTE|C70218_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70218_01 - Software AG|| TTTE|C70219_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70219_01 - HP - Hewlett-Packard Inc.|| TTTE|C70219_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70219_02 - HP - Hewlett-Packard Inc.|| TTTE|C70219_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70219_03 - HP - Hewlett-Packard Inc.|| TTTE|C70219_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70219_04 - HP - Hewlett-Packard Inc.|| TTTE|C70220_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70220_01 - Global Food Networks Inc.|| TTTE|C70222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70222_01 - National Broadband Network|| TTTE|C70223_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70223_01 - Mondia Media Group GmbH|| TTTE|C70225_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70225_01 - DragonWave|| TTTE|C70226_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70226_01 - ZON TV Cabo Portugal S.A.|| TTTE|C70227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70227_01 - Saskatchewan Telecommunications Holding Corp.|| TTTE|C70228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70228_01 - MULTICANAL IBERIA, S.L.U.|| TTTE|C70229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70229_01 - Redline Communications Group Inc|| TTTE|C70230_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70230_01 - Charter Communications, Inc.|| TTTE|C70231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70231_01 - EastLink|| TTTE|C70232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70232_01 - R Cable y Telecomunicaciones Galicia SA|| TTTE|C70236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70236_01 - Acision|| TTTE|C70237_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70237_01 - Acision|| TTTE|C70239_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70239_01 - Affarsverken Karlskrona|| TTTE|C70241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70241_01 - Airwave|| TTTE|C70244_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70244_01 - ANACOM|| TTTE|C70247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70247_01 - AR TELECOM|| TTTE|C70256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70256_01 - B.T.|| TTTE|C70258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70258_01 - Belgacom|| TTTE|C70259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70259_01 - Bisnode|| TTTE|C70264_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70264_01 - Brainbridge|| TTTE|C70265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70265_01 - British Telecom|| TTTE|C70267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70267_01 - Cabovisao|| TTTE|C70270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70270_01 - Certiel|| TTTE|C70275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70275_01 - Com Hem|| TTTE|C70277_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70277_01 - Convergent|| TTTE|C70282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70282_01 - Deutsche Telekom|| TTTE|C70283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70283_01 - Deutsche Telekom|| TTTE|C70287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70287_01 - DNA Oy|| TTTE|C52135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C52135_01 - JP/Politikens hus|| TTTE|C52307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C52307_01 - TV 2/Danmark|| TTTE|C60205_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C60205_01 - T-GESTIONA|| TTTE|C60235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C60235_01 - BT España Compañia de Servicios Globales|| TTTE|C70001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70001_01 - AT and T|| TTTE|C70001_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70001_02 - AT and T|| TTTE|C70001_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70001_03 - AT and T|| TTTE|C70001_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70001_04 - AT and T|| TTTE|C70001_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70001_05 - AT and T|| TTTE|C70001_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70001_06 - AT and T|| TTTE|C70002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70002_01 - Bell Aliant|| TTTE|C70003_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_02 - Bell Canada|| TTTE|C70003_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_03 - Bell Canada|| TTTE|C70003_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_04 - Bell Canada|| TTTE|C70003_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_05 - Bell Canada|| TTTE|C70003_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_06 - Bell Canada/City of Mississauga|| TTTE|C70003_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_07 - Bell Canada|| TTTE|C70003_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_10 - Bell Canada|| TTTE|C70003_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_11 - Bell Canada Tembec|| TTTE|C70003_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_12 - Bell Canada Davidson|| TTTE|C70003_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_13 - Bell Canada|| TTTE|C70003_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_14 - Bell Canada|| TTTE|C70003_15|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_15 - Bell Canada|| TTTE|C70003_16|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_16 - Bell Canada|| TTTE|C70003_17|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_17 - Bell Canada|| TTTE|C70003_18|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_18 - Bell Canada|| TTTE|C70003_19|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_19 - Bell Conferia|| TTTE|C70003_20|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_20 - Bell Media|| TTTE|C70003_21|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_21 - Bell Canada - 8121102|| TTTE|C70003_22|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_22 - Bell Canada - Treasury|| TTTE|C70003_23|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_23 - Bell Canada|| TTTE|C70003_24|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_24 - Bell Canada|| TTTE|C70003_25|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70003_25 - Bell Canada|| TTTE|C70004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70004_01 - Bell Distribution Inc.|| TTTE|C70499_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70499_01 - Telenor Shared Services|| TTTE|C70500_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70500_01 - TeliaSonera|| TTTE|C70501_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70501_01 - Telia Company|| TTTE|C70504_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70504_01 - TRANSACT CAPITAL COMMUNICATIONS PTY LTD|| TTTE|C70512_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70512_01 - T-Systems Ltd|| TTTE|C70515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70515_01 - UNITEL|| TTTE|C70527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_01 - VIVENDI UNIVERS.|| TTTE|C70527_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_02 - VIVENDI UNIVERS.|| TTTE|C70527_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_03 - VIVENDI UNIVERS.|| TTTE|C70527_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_04 - VIVENDI UNIVERS.|| TTTE|C70527_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_05 - VIVENDI UNIVERS.|| TTTE|C70527_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_06 - VIVENDI UNIVERS.|| TTTE|C70527_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_09 - VIVENDI UNIVERS.|| TTTE|C70527_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_10 - VIVENDI UNIVERS.|| TTTE|C70527_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_11 - VIVENDI UNIVERS.|| TTTE|C70527_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_12 - VIVENDI UNIVERS.|| TTTE|C70528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70528_01 - VODAFONE|| TTTE|C70528_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70528_02 - VODAFONE ESPA�A SA|| TTTE|C70529_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70529_01 - Vodafone|| TTTE|C70530_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70530_01 - Vodafone|| TTTE|C70531_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70531_01 - VODAFONE|| TTTE|C70532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70532_01 - Vodafone|| TTTE|C70533_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70533_01 - Vodafone Ltd|| TTTE|C70539_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70539_01 - ZDF|| TTTE|C70540_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70540_01 - ZON|| TTTE|C70546_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70546_01 - KPN|| TTTE|C70546_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70546_02 - KPN Group SA (Base) Belgium|| TTTE|C70548_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70548_01 - Swisscom|| TTTE|C70549_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70549_01 - Other Utilities|| TTTE|C70550_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70550_01 - T-Mobile Netherlands|| TTTE|C70552_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70552_01 - Ziggo|| TTTE|C80843_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80843_01 - Hutchison|| TTTE|C80853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80853_01 - Vodafone Procurement Company S.a.r.l|| TTTE|C81006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81006_01 - NextiraOne (UK) Ltd|| TTTE|C81031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81031_01 - BT UK Accounts Payable|| TTTE|C81078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81078_01 - COLLECTE LOCALISATION SATELLITES|| TTTE|C81094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81094_01 - EUTELSAT SA|| TTTE|C81115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81115_01 - IIS DT|| TTTE|C81117_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81117_01 - INMARSAT|| TTTE|C81126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81126_01 - OHB System AG|| TTTE|C81130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81130_01 - Positioneering Limited|| TTTE|C81132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81132_01 - Rezatec Ltd|| TTTE|C81143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81143_01 - Telespazio VEGA Deutschland GmbH|| TTTE|C80289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80289_01 - BT Accounts Payable-Harlequin|| TTTE|C80289_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80289_02 - BT Accounts Payable|| TTTE|C80332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80332_01 - CMC(Cognicase Management Consulting )|| TTTE|C80340_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80340_01 - Telefonica del Peru S.A|| TTTE|C80379_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80379_01 - TMN-Telecomunicações Moveis Nacionais,SA|| TTTE|C80414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80414_01 - Seat Pagine Gialle S.p.A.|| TTTE|C80467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80467_01 - Telecom New Zealand|| TTTE|C80474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80474_01 - Agencia EFE S.A.|| TTTE|C80478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80478_01 - Telecom NZ|| TTTE|C80515_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80515_01 - Channel_Four|| TTTE|C80604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80604_01 - Vodafone|| TTTE|C80745_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80745_01 - Sigma Systems|| TTTE|C80766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80766_01 - THV EDS-TELINDUS|| TTTE|C80767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80767_01 - QNH EUREGIO BVBA|| TTTE|C80773_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80773_01 - FairPoint Communications, Inc|| TTTE|C80773_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80773_02 - FairPoint Communications, Inc|| TTTE|C80788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80788_01 - NEO SKY 2002 S.A.|| TTTE|C80793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80793_01 - Telesur Latel Postbus 1839|| TTTE|C80802_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80802_01 - TELINDUS|| TTTE|C80803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80803_01 - QNH EUREGIO BVBA|| TTTE|C80826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80826_01 - De Persgroep|| TTTE|C81169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81169_01 - Groupe Pages Jaunes Cie|| TTTE|C81202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81202_01 - Telus|| TTTE|C81211_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81211_01 - Verizon Communications, Inc.|| TTTE|C81257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81257_01 - Telefónica|| TTTE|C81260_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81260_01 - TELEFONICA INGENIERIA DE SEGURIDAD MEXICO S.A DE C.V|| TTTE|C81265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81265_01 - BelgacomSABelgium|| TTTE|C81270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81270_01 - SeatPagineGialleS.p.A.|| TTTE|C81275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81275_01 - MegamediaTelevisiónS.L.|| TTTE|C81332_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81332_01 - CenturyLink, Inc.|| TTTE|C81381_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81381_01 - Telecon Inc|| TTTE|C81387_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81387_01 - Orange Polska S.A.|| TTTE|C81402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81402_01 - Nets Denmark A/S|| TTTE|C81413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81413_01 - Unify Communications Finland Oy|| TTTE|C81414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81414_01 - AS Äripäev|| TTTE|C81423_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81423_01 - Canadian Radio and Television|| TTTE|C81434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81434_01 - Aha! Agentur für Handelsmarketing GmbH|| TTTE|C81445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81445_01 - MCX - Merchant Customer Exchange LLC|| TTTE|C81461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81461_01 - CABOVISÃO|| TTTE|C81463_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81463_01 - MEO|| TTTE|C10311_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10311_03 - Transcontinental Medias|| TTTE|C10311_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10311_04 - Transcontinental Inc.|| TTTE|C10311_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10311_05 - Media Transcontinental - SEAO|| TTTE|C10478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10478_01 - Transcontinental Inc.|| TTTE|C10518_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10518_04 - YPG - Yellow Pages Group|| TTTE|C10518_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10518_05 - YPG - Yellow Pages Group|| TTTE|C10518_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10518_06 - YPG - Yellow Pages Group|| TTTE|C10311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10311_01 - Transcontinental Inc.|| TTTE|C10311_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10311_02 - Transcontinental Inc.|| TTTE|C70672_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70672_01 - Moyersoen|| TTTE|C70005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70005_01 - Bell ExpressVu|| TTTE|C70006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70006_01 - Bell Mobility|| TTTE|C70006_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70006_02 - Bell Mobility|| TTTE|C70006_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70006_03 - Bell Mobilité|| TTTE|C70007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70007_01 - Bell Solutions Impartition Inc.|| TTTE|C70007_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70007_02 - Bell Solutions Impartition Inc.|| TTTE|C70008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70008_01 - Bell Solutions Techniques|| TTTE|C70008_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70008_02 - Bell Solutions Techniques|| TTTE|C70009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70009_01 - Bell West Inc.|| TTTE|C70010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70010_01 - Bellsouth|| TTTE|C70010_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70010_02 - Bellsouth|| TTTE|C70010_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70010_03 - Bellsouth|| TTTE|C70011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70011_01 - Cogeco Cable|| TTTE|C70013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70013_01 - Comcast|| TTTE|C70013_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70013_02 - Comcast|| TTTE|C70016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70016_01 - Groupe TVA Inc.|| TTTE|C70018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70018_01 - Mobinil|| TTTE|C70018_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70018_02 - Mobinil|| TTTE|C70018_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70018_03 - Mobinil|| TTTE|C70019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70019_01 - MTS Allstream|| TTTE|C70022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70022_01 - Northwestel Inc.|| TTTE|C70023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70023_01 - Outsoursing - Telecom (GTMP - STSI)|| TTTE|C70025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70025_01 - Qwest|| TTTE|C70556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70556_01 - CANTV|| TTTE|C70566_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70566_01 - Gesfor USA de Movistar MX|| TTTE|C70582_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70582_01 - NEXTEL DEL PERU SA|| TTTE|C70586_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70586_01 - Telcel, C.A.|| TTTE|C70587_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70587_01 - Telefonica Ingenieria De Seguridad S.A.|| TTTE|C70588_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70588_01 - Telefonica Ingenieria De Seguridad S.A.U.|| TTTE|C70589_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70589_01 - TELEFONICA MOVILES SA|| TTTE|C70594_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70594_01 - Macquarie Telecom|| TTTE|C70601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70601_01 - ZON TV Cabo Portugal S.A.|| TTTE|C70612_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70612_01 - Xplornet Communications Inc.|| TTTE|C70613_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70613_01 - Hutchison 3G Austria|| TTTE|C70613_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70613_02 - HUTCHISON 3G UK LTD|| TTTE|C70653_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70653_01 - INFRAX|| TTTE|C70655_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70655_01 - Eltel Networks A/S|| TTTE|C70666_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70666_01 - Telmore A/S|| TTTE|C70670_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70670_01 - ecotel communication ag|| TTTE|C70673_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70673_01 - Ericcson Telecomunicazione S.p.A|| TTTE|C79999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C79999_01 - Other Sub Sector TTBM (old sub-sector)|| TTTE|C79999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C79999_02 - Other Sub Sector TTTE|| TTTE|C80161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80161_01 - HMG2|| TTTE|C80196_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80196_01 - BASE|| TTTE|C80221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80221_01 - Telefónica Germany GmbH & Co. OHG|| TTTE|C70319_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70319_01 - EMT|| TTTE|C70333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70333_01 - ePlus|| TTTE|C70337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70337_01 - Ericsson|| TTTE|C70349_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_01 - FRANCE TELEVISION|| TTTE|C70349_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_02 - FRANCE TELEVISION|| TTTE|C70349_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_03 - FRANCE TELEVISION|| TTTE|C70349_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_04 - FRANCE TELEVISION|| TTTE|C70349_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_05 - FRANCE TELEVISION|| TTTE|C70349_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_06 - FRANCE TELEVISION|| TTTE|C70349_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_09 - FRANCE TELEVISION|| TTTE|C70349_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70349_10 - FRANCE TELEVISION|| TTTE|C70351_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70351_01 - Gamma Telecom|| TTTE|C70354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70354_01 - GN Netcom A/S|| TTTE|C70371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70371_01 - IBM TuU|| TTTE|C70380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70380_01 - Itassalat Al Maghreb|| TTTE|C70400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70400_01 - MACQUARIE TELECOM|| TTTE|C70404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70404_01 - Media - Internet|| TTTE|C70418_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70418_01 - Nokia Siemens Networks Oy|| TTTE|C70426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70426_01 - OPTUS COMMUNICATIONS.|| TTTE|C70428_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_01 - ORANGE - FT|| TTTE|C70428_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_02 - ORANGE - FT|| TTTE|C70428_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_03 - ORANGE - FT|| TTTE|C70428_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_04 - ORANGE - FT|| TTTE|C70428_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_05 - ORANGE - FT|| TTTE|C70428_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_06 - ORANGE - FT|| TTTE|C70428_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_07 - ORANGE - FT|| TTTE|C70428_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_10 - ORANGE - FT|| TTTE|C70428_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_11 - ORANGE - FT|| TTTE|C70428_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_12 - ORANGE - FT|| TTTE|C70430_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70430_01 - oresundskraft|| TTTE|C70433_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70433_01 - Other - Telecommunications|| TTTE|C70438_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70438_01 - Other Telecommunications and Utilities|| TTTE|C70440_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_02 - OTHERS - TELCO MEDIA|| TTTE|C70440_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_03 - OTHERS - TELCO MEDIA|| TTTE|C70440_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_04 - OTHERS - TELCO MEDIA|| TTTE|C70440_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_05 - OTHERS - TELCO MEDIA|| TTTE|C70440_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_06 - OTHERS - TELCO MEDIA|| TTTE|C70440_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_09 - OTHERS - TELCO MEDIA|| TTTE|C70440_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_10 - OTHERS - TELCO MEDIA|| TTTE|C70440_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_11 - OTHERS - TELCO MEDIA|| TTTE|C70440_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_12 - OTHERS - TELCO MEDIA|| TTTE|C70441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70441_01 - Others Telco/Utilities|| TTTE|C70446_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70446_01 - PORTABIL|| TTTE|C70451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70451_01 - PT|| TTTE|C70474_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70474_01 - SKY (BRITISH SKY BROADCASTING LIMITED )|| TTTE|C70476_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70476_01 - SONAECOM|| TTTE|C70482_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70482_01 - Stofa A/S|| TTTE|C70487_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70487_01 - Swisscom|| TTTE|C70492_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70492_01 - TDC|| TTTE|C70493_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70493_01 - Tele2|| TTTE|C70494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70494_01 - Telecom|| TTTE|C70495_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70495_01 - O2 Slovakia|| TTTE|C70496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70496_01 - Telefonica O2|| TTTE|C70497_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70497_01 - Telefonica UK Limited|| TTTE|C70498_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70498_01 - Telenor|| TTTE|C70437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70437_01 - Other ? Telecommunications and Utilities|| TTTE|C10635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10635_01 - Journal de Montréal|| TTTE|C10643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10643_01 - St-Joseph Print Group Inc.|| TTTE|C10811_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10811_01 - Corporate Sun Media|| TTTE|C10259_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10259_02 - Journal de Québec|| TTTE|C70526_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70526_01 - Virgin Media|| TTTE|C80686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80686_01 - Quebecor Media inc.|| TTTE|C11054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C11054_01 - Landwirtschaftsverlag GmbH|| TTTE|C81479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81479_01 - Telefonica Ingenieria De Seguridad S.A.|| TTTE|C81480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81480_01 - Telefonica Ingenieria De Seguridad S.A.U.|| TTTE|C81494_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81494_01 - P97 Networks, Inc.|| TTTE|C60217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C60217_01 - Everis Spain S.L.|| TTTE|C70227_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70227_02 - Saskatchewan Telecommunications Holding Corp.|| TTTE|C70037_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70037_08 - TELUS Corporation|| TTTE|C70383_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70383_02 - JC DECAUX|| TTTE|C70383_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70383_09 - JC DECAUX|| TTTE|C70383_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70383_10 - JC DECAUX|| TTTE|C81532_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81532_01 - DirectWest|| TTTE|C30210_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C30210_01 - MTS Allstream|| TTTE|C50807_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C50807_01 - Prysmian|| TTTE|C10357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10357_01 - P. Services Montréal Inc.|| TTTE|C10367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10367_01 - PointPub Media Communications|| TTTE|C10368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10368_01 - Positron Public Safety Systems|| TTTE|C10393_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10393_01 - RDS.ca|| TTTE|C10405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10405_01 - RR Donnelley|| TTTE|C10420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10420_01 - Services techniques Nexxlink Inc.|| TTTE|C10473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10473_01 - Tira Wireless Canada Inc.|| TTTE|C10574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10574_01 - The Guardian|| TTTE|C10604_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10604_01 - JCDecaux|| TTTE|C10608_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10608_01 - Le Moniteur|| TTTE|C10649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10649_01 - Le Parisien|| TTTE|C10709_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10709_01 - KX Network Solutions|| TTTE|C10728_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10728_01 - Periodista Digital|| TTTE|C70376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70376_01 - Infrax|| TTTE|C70427_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70427_01 - Orange|| TTTE|C10154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10154_01 - Digital Cement Inc.|| TTTE|C10177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10177_01 - Entourage Solutions Technologiques Inc.|| TTTE|C10257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10257_01 - Jaguar Media Inc|| TTTE|C10282_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10282_01 - Le Progrès du Saguenay|| TTTE|C10283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10283_01 - Le Soleil|| TTTE|C10284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10284_01 - Lefebvre et Benoît|| TTTE|C10826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10826_01 - 1 and 1 Internet|| TTTE|C10879_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10879_02 - Positron Public Safety Systems|| TTTE|C51141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51141_01 - Atos|| TTTE|C51335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51335_01 - JCDecaux|| TTTE|C70104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70104_01 - Moconta|| TTTE|C70123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70123_01 - Cableurope|| TTTE|C70130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70130_01 - BCE Nexxia|| TTTE|C70137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70137_01 - StreamServ|| TTTE|C70139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70139_01 - Radiomovel|| TTTE|C70147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70147_01 - Motricity|| TTTE|C70147_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70147_02 - Motricity|| TTTE|C70155_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70155_01 - Family Communications|| TTTE|C70156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70156_01 - CenturyTel|| TTTE|C70157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70157_01 - Cygnal Technologies|| TTTE|C70163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70163_01 - T-Systems ITC Iberia|| TTTE|C70170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70170_01 - Versatel Holding|| TTTE|C70172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70172_01 - C1 SetCon|| TTTE|C70173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70173_01 - Internode|| TTTE|C70175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70175_01 - Nexans France|| TTTE|C70180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70180_01 - Bell Nordiq Group Inc.|| TTTE|C70181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70181_01 - Look|| TTTE|C70207_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70207_01 - Toshiba TEC Corporation|| TTTE|C70221_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70221_01 - Gexel Telecom International Inc.|| TTTE|C70224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70224_01 - D+S europe GmbH|| TTTE|C70233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70233_01 - NBN Co Limited|| TTTE|C70245_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70245_01 - Applicate|| TTTE|C70266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70266_01 - BT|| TTTE|C70403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70403_01 - Marsa|| TTTE|C70417_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70417_01 - Nokia|| TTTE|C70483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70483_01 - Svensk Karnbranslehantering|| TTTE|C70516_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70516_01 - UT General Budgetkund (anvands ej)|| TTTE|C70590_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70590_01 - TELESUR|| TTTE|C70615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70615_01 - BT|| TTTE|C70616_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70616_01 - Com Hem|| TTTE|C70617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70617_01 - Convergent|| TTTE|C70619_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70619_01 - Hi3G|| TTTE|C70620_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70620_01 - Nokia|| TTTE|C70621_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70621_01 - Orange|| TTTE|C70623_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70623_01 - TDC|| TTTE|C70624_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70624_01 - Tele2|| TTTE|C70625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70625_01 - Telecom|| TTTE|C70626_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70626_01 - Telenor|| TTTE|C70627_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70627_01 - TeliaSonera|| TTTE|C70628_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70628_01 - Bisnode|| TTTE|C70632_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70632_01 - Media - Internet|| TTTE|C70635_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70635_01 - Affarsverken Karlskrona|| TTTE|C70637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70637_01 - DONG A/S|| TTTE|C70639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70639_01 - Energy|| TTTE|C70642_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70642_01 - Hafslund ASA|| TTTE|C70649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70649_01 - oresundskraft|| TTTE|C70650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70650_01 - Ericsson|| TTTE|C70651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70651_01 - ENERSUR S.A.|| TTTE|C70652_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70652_01 - SOFTLINE INTERNATIONAL PERU S.A.C.|| TTTE|C70665_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70665_01 - TDC A/S|| TTTE|C80380_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80380_01 - PTSI-Sistemas de Informação, S.A.|| TTTE|C80395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80395_01 - SFR CEGETEL|| TTTE|C80429_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80429_01 - BLYK LIMITED|| TTTE|C80429_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80429_02 - BLYK LIMITED|| TTTE|C80429_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80429_03 - BLYK LIMITED|| TTTE|C80440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80440_01 - Net2Roam Limited|| TTTE|C80440_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80440_02 - Net2Roam Limited|| TTTE|C80440_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80440_03 - Net2Roam Limited|| TTTE|C80444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80444_01 - EVOLVED INTELLIGENCE LTD|| TTTE|C80444_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80444_02 - EVOLVED INTELLIGENCE LTD|| TTTE|C80551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80551_01 - KM_Group|| TTTE|C80617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80617_01 - BT|| TTTE|C80754_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80754_01 - Elion Ettevotted AS|| TTTE|C80805_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80805_01 - Comptel|| TTTE|C80836_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80836_01 - Cable & Wireless UK Ltd|| TTTE|C80839_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80839_01 - EE Ltd|| TTTE|C80851_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80851_01 - Talking Tech Ltd|| TTTE|C81003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81003_01 - AZZURRI COMMUNICATIONS LTD|| TTTE|C81028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81028_01 - AZZURRI COMMUNICATIONS LTD|| TTTE|C81261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81261_01 - TELEFONICA INGENIERIA DE SEGURIDAD MEXICO S.A DE C.V|| TTTE|C81262_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81262_01 - Charter Communications, Inc.|| TTTE|C81364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81364_01 - ANAC|| TTTE|C81401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81401_01 - O2 Czech Republic|| TTTE|C70288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70288_01 - DONG A/S|| TTTE|C70359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70359_01 - Hafslund ASA|| TTTE|C70366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70366_01 - Hi3G|| TTTE|C22175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C22175_01 - Telia Credit/Finans|| TTTE|C51316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51316_01 - IDT General Budgetkund (anvands ej)|| TTTE|C51320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51320_01 - Impresa|| TTTE|C52009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C52009_01 - Danmarks Radio|| TTTE|C60183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C60183_01 - DITEL CORPOTATION SAC|| TTTE|C70015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70015_01 - Fido Solutions Inc.|| TTTE|C70017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70017_01 - Institut international des telecommunications|| TTTE|C70021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70021_01 - Nordia Inc.|| TTTE|C70024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70024_01 - Psion Teklogix Inc.|| TTTE|C70027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70027_01 - SBC Communications|| TTTE|C70027_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70027_02 - SBC Communications|| TTTE|C70028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70028_01 - Sprint|| TTTE|C70029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70029_01 - Telebec Ltee|| TTTE|C70032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70032_01 - Telephonics Corporation|| TTTE|C70034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70034_01 - TIW - Telesystem International Wireless|| TTTE|C70038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70038_01 - Terrestar Networks|| TTTE|C70040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70040_01 - T-Mobile|| TTTE|C70040_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70040_02 - T-Mobile|| TTTE|C70046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70046_01 - Nexo|| TTTE|C70054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70054_01 - Télébec Ltée|| TTTE|C70063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70063_01 - Verizon Wireless|| TTTE|C70072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70072_01 - Volt Delta|| TTTE|C70073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70073_01 - Wind|| TTTE|C70080_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70080_01 - Bell Inf CTOS|| TTTE|C70081_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70081_01 - BEA Systems|| TTTE|C70083_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70083_01 - Connexim Inc.|| TTTE|C70083_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70083_02 - Connexim Inc.|| TTTE|C70090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70090_01 - ONO|| TTTE|C10808_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C10808_01 - Everis|| TTTE|C70405_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70405_01 - Meditel|| TTTE|C70316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70316_01 - Elisa Oyj|| TTTE|C70378_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70378_01 - INWI|| TTTE|C51186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C51186_01 - BTJ|| TTTE|C70085_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_13 - IBM Spain-Vodafone|| TTTE|C70085_14|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70085_14 - IBM Spain-Orange|| TTTE|C81573_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81573_01 - SICOTEL MOBILE|| TTTE|C81601_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81601_01 - Telecon Inc.|| TTTE|C81615_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81615_01 - HUTCHISON WHAMPOA 3G IP S.a r.l.|| TTTE|C81638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81638_01 - TDC Mobil Center A/S|| TTTE|C81639_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81639_01 - TDC Mobil Center A/S|| TTTE|C81661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81661_01 - Metronome Productions A/S|| TTTE|C81687_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81687_01 - MTS Inc.|| TTTE|C80302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C80302_01 - C80302_01 - Office of Communications|| TTTE|C81739_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81739_01 - C81739_01 - Grupo Arbulu|| TTTE|C81751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81751_01 - Globalive Communications Corp|| TTTE|C81755_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81755_01 - Canal Digital Kabel TV AS|| TTTE|C81780_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81780_01 - Datametrix AS|| TTTE|C81785_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81785_01 - TeliaSonera Norge AS|| TTTE|C81788_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81788_01 - TeliaSonera Norge Holding AS|| TTTE|C81793_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81793_01 - TECHNICOLOR SA|| TTTE|C81799_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81799_01 - EXTERION MEDIA|| TTTE|C81821_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81821_01 - Programma Bureau Burgernet|| TTTE|C81829_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81829_01 - Other Communications|| TTTE|C81869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81869_01 - Motion Pictures Laboratories Inc|| TTTE|C81870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81870_01 - Bob Communications Inc.|| TTTE|C81872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81872_01 - MCI Group Canada Inc.|| TTTE|C81893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81893_01 - Teliasonera Norge AS|| TTTE|C81894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81894_01 - 07 Media AS|| TTTE|C81901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81901_01 - Group360 Worldwide|| TTTE|C81938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81938_01 - Baseline T?l?matique Inc|| TTTE|C70128_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70128_02 - AMDOCS, Inc.|| TTTE|C70022_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70022_02 - Northwestel Inc.|| TTTE|C81963_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81963_01 - AT&T Inc.|| TTTE|C81987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81987_01 - Hutchison3G UK Ltd - UK|| TTTE|C81998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C81998_01 - MEDI TELECOM|| TTTE|C70527_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70527_13 - CANAL + DISTRIBUTION|| TTTE|C70440_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_13 - OTHERS - TELECO MEDIA|| TTTE|C82019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82019_01 - Ombudsman Services|| TTTE|C70440_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_07 - OTHERS - TELCO MEDIA|| TTTE|C70440_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70440_01 - OTHERS - TELCO MEDIA|| TTTE|C82037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82037_01 - Bell|| TTTE|C82107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82107_01 - Inspektionen f�r v�rd och omsorg, IVO|| TTTE|C82137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82137_01 - AT&T(formerly SBC)|| TTTE|C82151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82151_01 - FAIRPOINT COMMUNICATIONS INC.|| TTTE|C82202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82202_01 - Alma Media Oyj|| TTTE|C82234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82234_01 - Suomen Erillisverkot Oy|| TTTE|C82247_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82247_01 - Harris Corporation|| TTTE|C82270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82270_01 - Stampen AB|| TTTE|C82286_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82286_01 - Slovak Telekom a.s.|| TTTE|C82289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82289_01 - Orange Slovensko, a.s.|| TTTE|C82296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82296_01 - 3G Infrastructure Services AB|| TTTE|C70496_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70496_02 - E-PLUSMobilfunkGmbH&Co.KG|| TTTE|C82403_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82403_01 - Test-Aankoop CV|| TTTE|C82404_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82404_01 - Mediahuis NV|| TTTE|C82508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82508_01 - Swisscom|| TTTE|C82511_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82511_01 - FOD Mobiliteit en Vervoer|| TTTE|C82520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82520_01 - Gruner + Jahr GmbH & Co KG|| TTTE|C82524_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82524_01 - Mobilcom-debitel GmbH|| TTTE|C82527_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82527_01 - Verlagsgruppe Handelsblatt GmbH & Co. KG|| TTTE|C82535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82535_01 - Mobile Equity Corp|| TTTE|C82745_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82745_01 - FAIRPOINT COMMUNICATIONS INC.|| TTTE|C82768_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82768_01 - DirecTV|| TTTE|C82781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82781_01 - Publi-7 Communication|| TTTE|C82819_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82819_01 - T-Systems DMC AG|| TTTE|C82820_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82820_01 - T-Systems International GmbH|| TTTE|C82881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82881_01 - Amdocs|| TTTE|C82979_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C82979_01 - Quest|| TTTE|C83000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83000_01 - Manitoba Telecom Services Inc.|| TTTE|C83125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83125_01 - Conecta 5 Telecinco S.A.U|| TTTE|C83126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83126_01 - HUTCHISON WHAMPOA 3G IP S.? r.l.|| TTTE|C83144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83144_01 - Saskatchewan Telecommunications Holding Corp.|| TTTE|C83212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83212_01 - Charter Communications Operating LLC|| TTTE|C83300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83300_01 - Everis Spain S.L.|| TTTE|C83308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83308_01 - Reka Kaapeli Oy|| TTTE|C83310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83310_01 - Reka Kaapeli Oy|| TTTE|C83327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83327_01 - TeliaSonera Finland Oyj Financial|| TTTE|C83328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83328_01 - TeliaSonera Finland Oyj Financial|| TTTE|C70428_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70428_13 - ORANGE - FT|| TTTE|C83461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83461_01 - T-Mobile CZ|| TTTE|C70700_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70700_10 - SFR - NUMERICABLE|| TTTE|C70700_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C70700_12 - SFR - NUMERICABLE|| TTTE|C83495_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83495_01 - Comcast|| TTTE|C83622_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83622_01 - Sogetel|| TTTE|C83649_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83649_01 - Bell Canada|| TTTE|C83650_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83650_01 - Capgemini|| TTTE|C83744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83744_01 - AT&T Inc|| TTTE|C83766_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83766_01 - Bell Canada|| TTTE|C83767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83767_01 - BellSouth Telecommunications|| TTTE|C83775_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83775_01 - BORDER TO BORDER -KODIAK|| TTTE|C83786_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83786_01 - Capgemini|| TTTE|C83804_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83804_01 - Cingular (AT&T Wireless)|| TTTE|C83831_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83831_01 - COX COMMUNICATIONS|| TTTE|C83850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83850_01 - DirectTV|| TTTE|C83862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83862_01 - EMBARQ|| TTTE|C83863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83863_01 - Embratel|| TTTE|C83980_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83980_01 - Mobile Equity Corp|| TTTE|C83981_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C83981_01 - Mobinil|| TTTE|C84127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84127_01 - Trade Service Management|| TTTE|C84132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84132_01 - TURNER BROADCASTING|| TTTE|C84179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84179_01 - Bell Canada|| TTTE|C84180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84180_01 - AT&T|| TTTE|C21934_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C21934_07 - METRO|| TTTE|C84231_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84231_01 - Cox Media Group|| TTTE|C84283_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84283_01 - Charter Communications|| TTTE|C84287_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84287_01 - ViaSat, Inc|| TTTE|C84290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84290_01 - Level 3|| TTTE|C84292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84292_01 - National Cinemedia Inc|| TTTE|C84293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84293_01 - NBCUniversal|| TTTE|C84302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84302_01 - Telenet Group|| TTTE|C84347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84347_01 - Magyar Telekom Nyrt.|| TTTE|C84352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84352_01 - L-3 Communications Corporation|| TTTE|C84364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84364_01 - L-3 Communications Corporation|| TTTE|C84400_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84400_01 - Makedonski Telekom - AD Skopje|| TTTE|C84401_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TTTE_Att|C84401_01 - Hrvatski Telekom|| Telecom_and_Utilities|Utilities|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total Utilities|| Utilities|TUES|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TUES|C11118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C11118_01 - ELEXON|| TUES|C11146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C11146_01 - National Grid PLC|| TUES|C11156_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C11156_01 - RWE Npower|| TUES|C11161_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C11161_01 - SMART|| TUES|C11167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C11167_01 - THE NATIONAL GRID COMPANY PLC|| TUES|C22309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22309_01 - Capworks|| TUES|C22110_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22110_01 - Other|| TUES|C22111_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22111_01 - Other|| TUES|C22112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22112_01 - Other|| TUES|C31614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C31614_01 - SIG|| TUES|C51444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C51444_01 - Other|| TUES|C51551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C51551_01 - SCOTTISH & SOUTHERN ENERGY|| TUES|C51551_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C51551_02 - SCOTTISH & SOUTHERN ENERGY|| TUES|C70243_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70243_01 - Alinta Sales|| TUES|C70246_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70246_01 - APT MANAGEMENT SERVICES PTY LIMITED|| TUES|C70248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70248_01 - AREVA|| TUES|C70248_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70248_02 - AREVA|| TUES|C70248_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70248_03 - AREVA|| TUES|C70248_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70248_04 - AREVA|| TUES|C70248_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70248_05 - AREVA|| TUES|C70248_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70248_06 - AREVA|| TUES|C70248_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70248_09 - AREVA|| TUES|C70250_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70250_01 - Atriass|| TUES|C70251_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70251_01 - AURORA ENERGY PTY LTD|| TUES|C70252_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70252_01 - AUSGRID (Vendor 1853 or 16615)|| TUES|C70261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70261_01 - BKK Nett AS|| TUES|C70271_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70271_01 - CESP|| TUES|C70272_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70272_01 - CEZ|| TUES|C70274_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70274_01 - CKI/HEI ELECT DISTRIBUTION(SERVICES) P/L|| TUES|C70278_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70278_01 - CPFL|| TUES|C70279_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70279_01 - CS ENERGY LTD|| TUES|C70281_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70281_01 - DELTA ELECTRICITY|| TUES|C70290_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70290_01 - E.ON|| TUES|C70291_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70291_01 - E.ON|| TUES|C70292_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70292_01 - EANDIS|| TUES|C70293_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70293_01 - Eandis|| TUES|C70294_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70294_01 - EDA|| TUES|C70295_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70295_01 - EDEL|| TUES|C70296_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_01 - EDF SA|| TUES|C70296_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_02 - EDF SA|| TUES|C70296_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_03 - EDF SA|| TUES|C70296_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_04 - EDF SA|| TUES|C70296_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_05 - EDF SA|| TUES|C70296_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_06 - EDF SA|| TUES|C70296_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_07 - EDF SA|| TUES|C70296_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_09 - EDF SA|| TUES|C70296_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_10 - EDF SA|| TUES|C70296_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_11 - EDF SA|| TUES|C70296_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_12 - EDF SA|| TUES|C70296_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70296_13 - EDF SA|| TUES|C70297_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70297_01 - EDP Distribuicao|| TUES|C70298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70298_01 - EDP Empresas Comerciais DSI|| TUES|C70299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70299_01 - EDP GAS CURR|| TUES|C70300_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70300_01 - EDP Holding|| TUES|C70301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70301_01 - EDP Outsourcing & Infraestruturas|| TUES|C70302_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70302_01 - EDP Producao & Trading|| TUES|C70303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70303_01 - EDP Renovaveis|| TUES|C70304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70304_01 - EDP Solucoes Comercial Nao DSI|| TUES|C70305_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70305_01 - EDP Valor|| TUES|C70307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70307_01 - Eesti Energia|| TUES|C70309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70309_01 - Electra|| TUES|C70310_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70310_01 - Electrabel|| TUES|C70311_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70311_01 - Electrabel|| TUES|C70312_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70312_01 - Electricite de France|| TUES|C60337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C60337_01 - INTERNATIONAL POWER (AUSTRALIA) PTY LTD|| TUES|C60341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C60341_01 - JEMENA ASSET MANAGEMENT PTY LTD|| TUES|C70568_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70568_01 - Grupo Isolux Corsan S.A.|| TUES|C70568_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70568_02 - Grupo Isolux Corsan S.A.|| TUES|C70569_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70569_01 - Grupo Isolux Corsan S.A. y otros-UTE|| TUES|C70571_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70571_01 - Isolux Ingeniería S.A. e Iecsa S.A. UTE|| TUES|C70606_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70606_01 - ENERSUR SA|| TUES|C70614_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70614_01 - ERDF|| TUES|C70614_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70614_02 - ERDF|| TUES|C70614_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70614_03 - ERDF|| TUES|C70656_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70656_01 - Energi Fyn Holding A/S|| TUES|C70657_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70657_01 - Energi Midt|| TUES|C70664_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70664_01 - Nordjysk Elhandel A/S|| TUES|C70667_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70667_01 - Thy - Mors Energi|| TUES|C70669_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70669_01 - Vestforsyning Erhverv A/S|| TUES|C80065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80065_01 - National Grid|| TUES|C80002_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80002_01 - AEP - American Electric Power|| TUES|C80002_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80002_02 - AEP Service Corporation|| TUES|C80002_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80002_03 - American Electric Power Company, Inc.|| TUES|C80002_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80002_04 - American Electric Power Company, Inc.|| TUES|C80002_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80002_05 - American Electric Power Company, Inc.|| TUES|C80004_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80004_01 - AESO - Alberta Electric System Operator|| TUES|C80006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80006_01 - First Energy|| TUES|C80006_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80006_02 - First Energy|| TUES|C80007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80007_01 - AltaLink|| TUES|C80009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80009_01 - Connexus Energy|| TUES|C80009_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80009_02 - Connexus Energy|| TUES|C80010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80010_01 - Constellation Energy Group|| TUES|C80010_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80010_02 - Constellation Energy Group|| TUES|C80013_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80013_01 - Los Angeles - Department of water and power (LADWP)|| TUES|C80013_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80013_02 - Los Angeles - Department of water and power (LADWP)|| TUES|C80013_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80013_03 - Los Angeles - Department of water and power (LADWP)|| TUES|C80013_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80013_04 - Los Angeles - Department of water and power (LADWP)|| TUES|C80015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80015_01 - Duquesne Light Company|| TUES|C80015_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80015_02 - Duquesne Light Company|| TUES|C80015_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80015_03 - Duquesne Light Company|| TUES|C80016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80016_01 - EPB - Electric Power Board of Chattanooga|| TUES|C80016_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80016_02 - EPB - Electric Power Board of Chattanooga|| TUES|C80018_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80018_01 - Exelon Business Services Corporation|| TUES|C80018_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80018_02 - Exelon Business Services Corporation|| TUES|C80020_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80020_01 - Hydro One Networks Inc.|| TUES|C80020_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80020_02 - Hydro One Networks Inc.|| TUES|C80020_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80020_03 - Hydro One Networks Inc.|| TUES|C80021_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80021_01 - Hydro Ottawa|| TUES|C80022_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80022_01 - Hydro-Quebec|| TUES|C80022_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80022_04 - Hydro-Québec|| TUES|C80022_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80022_05 - Hydro-Québec|| TUES|C80022_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80022_06 - Hydro-Québec|| TUES|C80022_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80022_07 - Hydro-Québec|| TUES|C80022_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80022_08 - Hydro-Québec|| TUES|C80023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80023_01 - Idaho Power|| TUES|C80023_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80023_02 - Idaho Power|| TUES|C80024_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80024_01 - Indianapolis Power and Light Company|| TUES|C80024_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80024_02 - Indianapolis Power and Light Company|| TUES|C80025_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80025_01 - JEA|| TUES|C80025_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80025_02 - JEA|| TUES|C80027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80027_01 - Manitoba Hydro 1|| TUES|C80027_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80027_02 - Manitoba Hydro 2|| TUES|C80029_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80029_01 - MidAmerican Energy|| TUES|C80029_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80029_02 - MidAmerican Energy|| TUES|C80029_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80029_03 - MidAmerican Energy|| TUES|C80030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80030_01 - NB - New-Brunswick Power|| TUES|C80030_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80030_02 - NB - New-Brunswick Power|| TUES|C80031_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80031_03 - Northeast Utilities Service Co|| TUES|C80032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80032_01 - NSTAR Electric and Gas Corporation|| TUES|C80032_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80032_02 - NSTAR Electric and Gas Corporation|| TUES|C80032_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80032_03 - NSTAR Electric & Gas Corporation|| TUES|C80033_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80033_01 - NSTAR Services Company|| TUES|C80033_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80033_02 - NSTAR Services Company|| TUES|C80034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80034_01 - NW Natural|| TUES|C80034_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80034_02 - NW Natural|| TUES|C80035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80035_01 - Oklahoma Gas and Electric Company|| TUES|C80035_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80035_02 - Oklahoma Gas and Electric Company|| TUES|C80036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80036_01 - Omaha Public Power District|| TUES|C80036_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80036_02 - Omaha Public Power District|| TUES|C80037_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80037_01 - Ontario Power Generation Inc.|| TUES|C80038_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80038_01 - Orlando Utilities Commission|| TUES|C80038_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80038_02 - Orlando Utilities Commission|| TUES|C80038_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80038_03 - Orlando Utilities Commission (OUC)|| TUES|C80040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80040_01 - Puget Sound Energy|| TUES|C80040_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80040_02 - Puget Sound Energy|| TUES|C80042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80042_01 - San Diego Gas and Electric|| TUES|C80042_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80042_02 - San Diego Gas and Electric|| TUES|C80042_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80042_03 - San Diego Gas and Electric|| TUES|C80043_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80043_01 - SaskPower|| TUES|C80045_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80045_01 - Southern California Edison Company|| TUES|C80045_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80045_02 - Southern California Edison Company|| TUES|C80046_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80046_01 - Southern Maryland Electric Co-Op|| TUES|C80046_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80046_02 - Southern Maryland Electric Co-Op|| TUES|C80046_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80046_03 - Southern Maryland Electric Co-Op|| TUES|C80047_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80047_01 - Tampa Electric Company|| TUES|C80047_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80047_02 - Teco Energy|| TUES|C80047_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80047_03 - Tampa Electric Company (TECO)|| TUES|C80052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80052_01 - We Energies|| TUES|C80052_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80052_02 - We Energies|| TUES|C80052_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80052_03 - We Energies|| TUES|C80054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80054_01 - UEM - Usine d'électricité de Metz|| TUES|C80054_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80054_02 - UEM - Usine d'électricité de Metz|| TUES|C80054_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80054_03 - UEM - Usine d'électricité de Metz|| TUES|C80055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80055_01 - Électricité de Strasbourg|| TUES|C80055_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80055_02 - Électricité de Strasbourg|| TUES|C80056_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80056_01 - EDF - Électricité de France|| TUES|C80056_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80056_02 - EDF - Électricité de France|| TUES|C80057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80057_01 - Enmax Corporation|| TUES|C80058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80058_01 - NS Power|| TUES|C80058_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80058_02 - Emera|| TUES|C80062_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80062_01 - Bangor Hydro Electric Company|| TUES|C80869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80869_01 - Elster Metering Systems|| TUES|C80870_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80870_01 - EON IS Gmbh|| TUES|C80871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80871_01 - FERRANTICOMPUTERSYSTEMSN.V|| TUES|C80872_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80872_01 - GE Energy|| TUES|C80873_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80873_01 - GEMSERV Ltd|| TUES|C80874_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80874_01 - Horizon Nuclear Power|| TUES|C80875_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80875_01 - IBMUnitedKingdomLtd|| TUES|C80876_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80876_01 - INTERNATIONAL POWER|| TUES|C80877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80877_01 - Itron Metering Solutions|| TUES|C80879_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80879_01 - LOWRIBECKSERVICESLIMITED|| TUES|C80880_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80880_01 - Magnox Limited|| TUES|C80881_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80881_01 - METASPHERE|| TUES|C80882_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80882_01 - Morrison Utility Services|| TUES|C80883_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80883_01 - NATIONAL GRID PLC|| TUES|C80884_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80884_01 - NEAS ENERGY A/S|| TUES|C80886_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80886_01 - Northern Powergrid|| TUES|C80887_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80887_01 - Onstream|| TUES|C80888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80888_01 - RWE NPOWER|| TUES|C80889_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80889_01 - SCOTTISH & SOUTHERN ENERGY|| TUES|C80890_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80890_01 - SCOTTISHPOWER|| TUES|C80892_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80892_01 - SIEMENS ENERGY SERVICES|| TUES|C80894_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80894_01 - SPARK ENERGY SUPPLY LIMITED|| TUES|C80895_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80895_01 - UK Power Networks Holdings Limited|| TUES|C80896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80896_01 - United Utilities|| TUES|C80897_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80897_01 - Western Power Distribution|| TUES|C81023_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81023_01 - SCOTTISH & SOUTHERN ENERGY|| TUES|C81151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81151_01 - Smart DCC Limited|| TUES|C81152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81152_01 - Enzen Global|| TUES|C81157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81157_01 - TBD|| TUES|C81163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81163_01 - Consolidated Edison, Inc.|| TUES|C81163_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81163_02 - Consolidated Edison, Inc.|| TUES|C80257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80257_01 - SSE plc|| TUES|C80285_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80285_01 - Iberdrola , S.A.|| TUES|C80301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80301_01 - EDF ENERGY (LONDON ENERGY)|| TUES|C80301_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80301_02 - EDF ENERGY (LONDON ENERGY)|| TUES|C80333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80333_01 - ERG RENEW S.P.A.|| TUES|C80344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80344_01 - ELEXON Limited|| TUES|C80347_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80347_01 - Onstream|| TUES|C80390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80390_01 - Dominion Resources Services, Inc|| TUES|C80419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80419_01 - Other - Utilities|| TUES|C80452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80452_01 - Long Island Power Authority|| TUES|C80452_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80452_02 - Long Island Power Authority|| TUES|C80464_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80464_01 - ENERGA S.A.|| TUES|C80466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80466_01 - Public Service Electric & Gas|| TUES|C80483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80483_01 - EDP-Energias de Portugal, SA|| TUES|C80485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80485_01 - Nord Trøndelag Elektristitesv.|| TUES|C80528_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80528_01 - Dounreay_Site_Restoration|| TUES|C80591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80591_01 - Sellafield|| TUES|C80705_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80705_01 - GREEN STATE POWER PTY LTD|| TUES|C80726_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80726_01 - Yello Strom GmbH|| TUES|C80740_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80740_01 - EDF-SEI|| TUES|C80813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80813_01 - EDP Soluþses Comerciais, S.A.|| TUES|C81170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81170_01 - Red Electrica de España S.A.|| TUES|C81188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81188_01 - The Southern Company|| TUES|C81193_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81193_01 - Energy Networks Association|| TUES|C81213_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81213_01 - Lee County Electric Cooperative, Inc.|| TUES|C81229_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81229_01 - CCAS IEG|| TUES|C81284_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81284_01 - SanteeCooper|| TUES|C81331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81331_01 - Liberty Energy Utilities (NH) Corp|| TUES|C81447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81447_01 - Puerto Rico Electric Power Authority|| TUES|C81453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81453_01 - EDP RENEWABLES NORTH AMERICA LLC|| TUES|C89999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C89999_01 - Other Sub Sector TUES|| TUES|C80065_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80065_02 - National Grid|| TUES|C80072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80072_01 - Brascan Energie Marketing Inc.|| TUES|C80079_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80079_01 - Northeast Utilities|| TUES|C80079_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80079_02 - Northeast Utilities|| TUES|C80079_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80079_03 - Northeast Utilities|| TUES|C80079_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80079_04 - Northeast Utilities System|| TUES|C80090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80090_01 - Tacoma Power|| TUES|C80090_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80090_02 - Tacoma Power|| TUES|C80092_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80092_01 - SHECO - Sam Houston Electric Cooperative|| TUES|C80092_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80092_02 - SHECO - Sam Houston Electric Cooperative|| TUES|C80094_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80094_01 - Madison Gas and Electric|| TUES|C80094_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80094_02 - Madison Gas and Electric|| TUES|C80094_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80094_03 - Madison Gas and Electric|| TUES|C80096_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80096_01 - Consumers Energy|| TUES|C80096_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80096_02 - Consumers Energy|| TUES|C80097_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80097_01 - OneOk|| TUES|C80097_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80097_02 - OneOk|| TUES|C80097_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80097_03 - ONEOK, Inc.|| TUES|C80102_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80102_01 - Régie du syndicat électrique intercommunal du Pays Chartrain|| TUES|C80102_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80102_02 - Régie du syndicat électrique intercommunal du Pays Chartrain|| TUES|C80102_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80102_03 - Régie du syndicat électrique intercommunal du Pays Chartrain|| TUES|C80104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80104_01 - Endurance Energy|| TUES|C80106_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80106_01 - JEA - Jacksonville Electric Authority|| TUES|C80109_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80109_01 - BGE - Baltimore Gas and Electric|| TUES|C80109_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80109_02 - BGE - Baltimore Gas and Electric|| TUES|C80113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80113_01 - Pennsylvania Power and Light Corporation|| TUES|C80113_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80113_02 - Pennsylvania Power and Light Corporation|| TUES|C80114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80114_01 - Direct Energy Marketing Ltd|| TUES|C80116_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80116_01 - PPL Electric Utilities|| TUES|C80116_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80116_02 - PPL Electric Utilities|| TUES|C80118_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80118_01 - MDU - Montana Dakota Utilities|| TUES|C80118_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80118_02 - MDU - Montana Dakota Utilities|| TUES|C80119_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80119_01 - Kinectrics|| TUES|C80120_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80120_01 - Atco I-Tek|| TUES|C80120_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80120_02 - Wipro Solutions Canada Limited|| TUES|C80126_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80126_01 - Consortium SNGI|| TUES|C80126_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80126_02 - Consortium SNGI|| TUES|C80127_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80127_01 - Ontario Power Authority|| TUES|C80129_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80129_01 - PSEG Services Corporation|| TUES|C80129_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80129_02 - PSEG Services Corporation|| TUES|C80130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80130_01 - Capital Power Corporation|| TUES|C80131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80131_01 - Seolis|| TUES|C80131_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80131_02 - Seolis|| TUES|C80131_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80131_03 - Seolis|| TUES|C80132_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80132_01 - Nuon Belgium|| TUES|C80133_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80133_01 - GEG|| TUES|C80133_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80133_02 - GEG|| TUES|C80133_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80133_03 - GEG|| TUES|C80134_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80134_01 - SPARK|| TUES|C80135_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80135_01 - Kansas City Power and Light|| TUES|C80135_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80135_02 - Kansas City Power and Light|| TUES|C80135_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80135_03 - Kansas City Power and Light|| TUES|C80136_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80136_01 - London Hydro|| TUES|C80137_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80137_01 - Great Plains Energy Services Inc.|| TUES|C80137_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80137_02 - Great Plains Energy Services Inc.|| TUES|C80138_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80138_01 - ATCO Electric|| TUES|C80139_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80139_01 - enXco Development Corporation|| TUES|C80140_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80140_01 - Efficiency Nova Scotia|| TUES|C80141_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80141_01 - Capgemini Canada Inc.|| TUES|C80144_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80144_01 - BC Hydro|| TUES|C80146_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80146_01 - EDF EN Canada Development Inc (ECDI)|| TUES|C80147_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80147_01 - E.on|| TUES|C80147_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80147_02 - E.on|| TUES|C80149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80149_01 - Entergy|| TUES|C80151_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80151_01 - Nashville Electric Service|| TUES|C80151_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80151_02 - Nashville Electric Service|| TUES|C80151_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80151_03 - Nashville Electric Service|| TUES|C80153_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80153_01 - AF MERCADOS ENERGY MARKETS INTERNATIONAL SA|| TUES|C80158_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80158_01 - E.D.F|| TUES|C80159_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80159_01 - E.ON|| TUES|C80162_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80162_01 - Horizon Nuclear Power|| TUES|C80163_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80163_01 - LOWRI BECK SERVICES|| TUES|C80167_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80167_01 - National Grid PLC|| TUES|C80169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80169_01 - Northern Powergrid Limited|| TUES|C80170_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80170_01 - RWE Npower|| TUES|C80171_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80171_01 - Scottish Power|| TUES|C80174_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80174_01 - SMART|| TUES|C80175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80175_01 - UK Power Networks Holdings Limited PROBTP UNDER RETAIL|| TUES|C80176_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80176_01 - United Utilities|| TUES|C80179_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80179_01 - Western Power Distribution|| TUES|C80184_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80184_01 - PowerStream|| TUES|C80186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80186_01 - ENERGYAUSTRALIA PTY LTD|| TUES|C80189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80189_01 - Integrys Energy Group, Inc.|| TUES|C80189_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80189_02 - Integrys Energy Group, Inc.|| TUES|C80191_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80191_01 - Florida Power & Light Company (FPL)|| TUES|C80199_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80199_01 - RAETIE ENERGIE AG|| TUES|C80200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80200_01 - British Nuclear Fuels Ltd|| TUES|C80202_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80202_01 - Electricity North West Ltd|| TUES|C80203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80203_01 - Neas Energy|| TUES|C80216_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80216_01 - Westar Energy|| TUES|C80217_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80217_01 - El Paso Electric Company|| TUES|C80222_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80222_01 - Con Edison|| TUES|C80222_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80222_02 - Con Edison|| TUES|C80224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80224_01 - Portland General Electric Company|| TUES|C80224_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80224_02 - Portland General Electric Company|| TUES|C80254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80254_01 - Duke Energy Corporation|| TUES|C80255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80255_01 - Cobb EMC|| TUES|C70313_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70313_01 - Elenia Verkko Oy|| TUES|C70314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70314_01 - Eletropaulo|| TUES|C70315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70315_01 - Elia|| TUES|C70317_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70317_01 - Eltel|| TUES|C70320_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70320_01 - EnBW|| TUES|C70321_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70321_01 - ENDEAVOUR ENERGY - ABN 11 247 365 823|| TUES|C70324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70324_01 - ENEOP|| TUES|C70326_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70326_01 - Energi Danmark A/S|| TUES|C70327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70327_01 - Energias do Brasil|| TUES|C70328_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70328_01 - Energinet.dk|| TUES|C70329_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70329_01 - Energy|| TUES|C70331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70331_01 - ENTERPRISE BUSINESS SERVICES (AUSTRALIA) PTY LTD|| TUES|C70334_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70334_01 - ORIGIN ENERGY ERARING|| TUES|C70336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70336_01 - ERGON ENERGY CORPORATION LTD|| TUES|C70338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70338_01 - ESSENTIAL ENERGY|| TUES|C70342_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70342_01 - EWE|| TUES|C70343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70343_01 - FIJI ELECTRIC AUTHORITY|| TUES|C70344_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70344_01 - Fjordkraft AS|| TUES|C70348_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70348_01 - Fortum|| TUES|C70357_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70357_01 - Grupo Rede|| TUES|C70360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70360_01 - Hafslund Fakturaservice AS|| TUES|C70362_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70362_01 - Halogaland Kraft As|| TUES|C70363_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70363_01 - Haugaland Kraft As|| TUES|C70365_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70365_01 - HelgelandsKraft AS|| TUES|C70367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70367_01 - Hidrocantabrico|| TUES|C70369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70369_01 - Hydro Electric Corporation|| TUES|C70369_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70369_02 - Hydro Electric Corporation|| TUES|C70370_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70370_01 - Iberdrola Portugal|| TUES|C70384_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70384_01 - JEMENA ASSET MANAGEMENT (6) PTY LTD|| TUES|C70390_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70390_01 - Lappeenrannan Energia Oy|| TUES|C70394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70394_01 - Luminus|| TUES|C70395_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70395_01 - LUMO ENERGY|| TUES|C70396_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70396_01 - Lunds Energi|| TUES|C70397_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70397_01 - Lyse AS|| TUES|C70398_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70398_01 - Lyse Energi AS|| TUES|C70399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70399_01 - MACQUARIE GENERATION (Vendor No 106550)|| TUES|C70402_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70402_01 - MARCHMENT HILL CONSULTING PTY LTD|| TUES|C70406_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70406_01 - Midt Nett Buskerud AS|| TUES|C70411_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70411_01 - Multi-Utilities|| TUES|C70415_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70415_01 - Neoenergia|| TUES|C70416_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70416_01 - NETTALLIANSEN AS|| TUES|C70419_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70419_01 - Nord Energi A.m.b.a.|| TUES|C70420_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70420_01 - Nordmore Energiverk AS|| TUES|C70422_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70422_01 - NTE Nett AS|| TUES|C70431_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70431_01 - OTE|| TUES|C70432_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70432_01 - Other - Telecommunications and Utilities|| TUES|C70434_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70434_01 - Other - Telecommunications and Utilities|| TUES|C70436_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70436_01 - Other - Telecommunications and Utilities|| TUES|C70439_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_01 - OTHERS - E&U|| TUES|C70439_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_02 - OTHERS - E&U|| TUES|C70439_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_03 - OTHERS - E&U|| TUES|C70439_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_04 - OTHERS - E&U|| TUES|C70439_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_05 - OTHERS - E&U|| TUES|C70439_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_06 - OTHERS - E&U|| TUES|C70439_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_09 - OTHERS - E&U|| TUES|C70439_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_10 - OTHERS - E&U|| TUES|C70439_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_11 - OTHERS - E&U|| TUES|C70439_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_12 - OTHERS - E&U|| TUES|C70442_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70442_01 - Others TuU|| TUES|C70444_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70444_01 - Pohjois-Karjalan Sahko Oy|| TUES|C70447_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70447_01 - POWER AND WATER CORPORATION (Supplier Code 53584)|| TUES|C70448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70448_01 - POWERCOR AUSTRALIA|| TUES|C70449_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70449_01 - Prazska energetika|| TUES|C70450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70450_01 - Pressdata|| TUES|C70456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70456_01 - Repower|| TUES|C70459_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70459_01 - Innogy|| TUES|C70460_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70460_01 - RWE|| TUES|C70466_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70466_01 - Savon Voima Oyj|| TUES|C70467_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70467_01 - Scanenergi A/S|| TUES|C70473_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70473_01 - Skagerak Nett AS|| TUES|C70478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70478_01 - SPI ELECTRICITY PTY LTD|| TUES|C70481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70481_01 - STANWELL CORPORATION LTD|| TUES|C70486_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70486_01 - SWB AG|| TUES|C70488_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70488_01 - SWK|| TUES|C70490_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70490_01 - Tafjord Kraftnett AS|| TUES|C70505_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70505_01 - TRANSGRID (Supplier Code 017918)|| TUES|C70506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70506_01 - TRANSPOWER NEW ZEALAND LTD|| TUES|C70507_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70507_01 - TRE-FOR A/S|| TUES|C70509_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70509_01 - Tronder Energi Nett As|| TUES|C70510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70510_01 - TRU ENERGY SERVICES PTY LTD (Creditor No 102892)|| TUES|C70513_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70513_01 - Tussa Kraft AS|| TUES|C70514_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70514_01 - UNITED ENERGY DISTRIBUTION PTY LIMITED|| TUES|C70518_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70518_01 - Utilities|| TUES|C70520_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70520_01 - Vattenfall|| TUES|C70521_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70521_01 - Vattenfall|| TUES|C70534_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70534_01 - VTU Energy GmbH|| TUES|C70543_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70543_01 - EDSN|| TUES|C70544_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70544_01 - ENECO|| TUES|C70551_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70551_01 - Utilities Other|| TUES|C80850_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80850_01 - SSE Energy Supply|| TUES|C80862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80862_01 - E.ON|| TUES|C80863_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80863_01 - EDF ENERGY (LONDON ENERGY)|| TUES|C80864_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80864_01 - EDF ENERGY (24 SEVEN)|| TUES|C80866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80866_01 - Eirgrid|| TUES|C80867_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80867_01 - Electricity North West Ltd|| TUES|C80868_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80868_01 - ELEXON|| TUES|C80063_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80063_05 - Enbridge Gas Distribution Inc|| TUES|C21783_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C21783_03 - MAPFRE, S.A.|| TUES|C30813_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C30813_02 - Springfield, CU|| TUES|C81337_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81337_01 - ENERGA INFORMATYKA I TECHNOLOGIE SP Z O O|| TUES|C81376_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81376_01 - Tecteo|| TUES|C70455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70455_01 - REN|| TUES|C81375_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81375_01 - Eni Gas & Power|| TUES|C81485_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81485_01 - Pepco Holdings, Inc.|| TUES|C81496_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81496_01 - Energie Baden-Württemberg AG|| TUES|C81508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81508_01 - OVO energy|| TUES|C80239_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80239_02 - EFLUID SAS|| TUES|C60338_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C60338_01 - UTILISOFT PTY LTD|| TUES|C80266_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80266_01 - Duke Energy|| TUES|C81368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81368_01 - INDAQUA|| TUES|C81408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81408_01 - SourcePower B.V.|| TUES|C10369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C10369_01 - Precision Energy Services Inc.|| TUES|C70618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70618_01 - Eltel|| TUES|C70633_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70633_01 - Pressdata|| TUES|C70638_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70638_01 - E.ON|| TUES|C70641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70641_01 - Fortum|| TUES|C70643_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70643_01 - Lunds Energi|| TUES|C70644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70644_01 - Multi-Utilities|| TUES|C70646_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70646_01 - Utilities|| TUES|C70648_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70648_01 - Vattenfall|| TUES|C22039_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22039_01 - FS General Budgetkund (anvands ej)|| TUES|C22040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22040_01 - FS Target Budgetkund (anvands ej)|| TUES|C22113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22113_01 - Other|| TUES|C22114_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22114_01 - Other|| TUES|C22115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C22115_01 - Other|| TUES|C31565_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C31565_01 - Other|| TUES|C31813_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C31813_01 - VHS|| TUES|C51443_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C51443_01 - Other|| TUES|C51445_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C51445_01 - Other|| TUES|C51896_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C51896_01 - Other|| TUES|C60200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C60200_01 - PACIFICO WASHINGTON-JUNTA|| TUES|C70280_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70280_01 - CTT|| TUES|C70322_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70322_01 - Endesa|| TUES|C70330_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70330_01 - ENNESTY ENERGY PTY LTD|| TUES|C70425_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70425_01 - Operador do Mercado Iberico Energia (OMIP)|| TUES|C70435_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70435_01 - Other - Telecommunications and Utilities|| TUES|C70517_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70517_01 - UT Target Budgetkund (anvands ej)|| TUES|C70558_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70558_01 - Colbun S.A.|| TUES|C70583_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70583_01 - RED DE ENERGIA del peru|| TUES|C70591_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70591_01 - Termotasajero S.A. ESP|| TUES|C70654_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70654_01 - DONG Energy Power A/S|| TUES|C80005_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80005_01 - AB - Energy and Utility Board|| TUES|C80016_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80016_03 - USA/TN - Chattanooga Electric Power Board (EPB)|| TUES|C80017_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80017_01 - Enmax Corporation|| TUES|C80060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80060_01 - NS Power|| TUES|C80073_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80073_01 - Nebraska Public Power|| TUES|C80078_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80078_01 - Miller Energy|| TUES|C80089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80089_01 - Bonneville Power Administration|| TUES|C80089_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80089_02 - Bonneville Power Administration|| TUES|C80107_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80107_01 - Pacific Gas and Electric Company|| TUES|C80107_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80107_02 - Pacific Gas and Electric Company|| TUES|C80122_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80122_01 - Allegheny Power|| TUES|C80125_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80125_01 - Black Hills|| TUES|C80154_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80154_01 - Grand Bahama Power Company|| TUES|C80253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80253_01 - RSEIPC|| TUES|C80448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80448_01 - PROVECTA PROCESS AUTOMATION PTY LTD|| TUES|C80865_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80865_01 - EDMI Europe Limited|| TUES|C80891_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80891_01 - Secure Meters|| TUES|C81235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81235_01 - UE & MULTINET PTY LTD|| TUES|C81367_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81367_01 - EDP RENEWABLES EUROPE S.L.|| TUES|C70508_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70508_01 - Troms Kraft AS|| TUES|C80270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80270_01 - LG&E and KU Services Company|| TUES|C70374_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70374_01 - Indexis|| TUES|C70389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70389_01 - Lampiris|| TUES|C70356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70356_01 - Grupo GENERG|| TUES|C81556_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81556_01 - Hydro-Quebec Distribution|| TUES|C81188_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81188_02 - The Southern Company|| TUES|C81680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81680_01 - City Utilities of Springfield (CUS)|| TUES|C81690_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81690_01 - EPCOR Utilities Inc.|| TUES|C81715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81715_01 - AusNet Electricity Services Pty Ltd|| TUES|C81717_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81717_01 - Consolidated Power Projects|| TUES|C81723_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81723_01 - GSP ENERGY Pty Limited? (Trustpower)|| TUES|C81727_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81727_01 - South Australia Power Networks|| TUES|C81729_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81729_01 - Tasmanian Networks Pty Ltd|| TUES|C81756_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81756_01 - VOKKS Nett AS|| TUES|C81758_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81758_01 - SFE Kraft AS|| TUES|C81759_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81759_01 - Midt Telemark Energi|| TUES|C81761_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81761_01 - Odda Energi AS|| TUES|C81763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81763_01 - Tinn Energi AS|| TUES|C81764_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81764_01 - Svorka Energi AS|| TUES|C81767_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81767_01 - For Better Days AS|| TUES|C81769_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81769_01 - Nord Tr�ndelag Elektristitesv.|| TUES|C81781_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81781_01 - Conrad Langaard AS|| TUES|C81787_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81787_01 - Lyse IT AS|| TUES|C81796_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81796_01 - DCC-FP|| TUES|C80466_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80466_02 - Public Service Electric & Gas|| TUES|C80452_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80452_03 - Long Island Power Authority|| TUES|C81801_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81801_01 - Enexis|| TUES|C81826_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81826_01 - Stedin|| TUES|C81830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81830_01 - Alliander|| TUES|C81853_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81853_01 - AGL Macquarie Pty Limited|| TUES|C81855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81855_01 - ORIGIN ENERGY|| TUES|C80045_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C80045_03 - Southern California Edison Company|| TUES|C81331_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81331_02 - Liberty Energy Utilities (NH) Corp|| TUES|C81921_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81921_01 - INDIANAPOLIS POWER & LIGHT COMPANY|| TUES|C81933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81933_01 - Citizens Energy Group|| TUES|C81994_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C81994_01 - Louisville Gas and Electric Company|| TUES|C82003_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82003_01 - REPOWER AG|| TUES|C82010_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82010_01 - Nethys|| TUES|C82031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82031_01 - Enercon Canada Inc.|| TUES|C82035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82035_01 - Nashville Electric Service|| TUES|C82048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82048_01 - M�lndal Energi AB|| TUES|C82050_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82050_01 - Eskilstuna Str�ngn�s Energi och Milj� AB|| TUES|C82052_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82052_01 - AB Borl�nge Energi|| TUES|C82053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82053_01 - V�sterviks kommun|| TUES|C82054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82054_01 - Oskarshamns Energi AB|| TUES|C82055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82055_01 - Ystad Energi AB|| TUES|C82057_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82057_01 - Norrt�lje Energi AB|| TUES|C82058_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82058_01 - Halmstads Energi och Milj� AB|| TUES|C82060_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82060_01 - Sollentuna Energi AB|| TUES|C82061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82061_01 - Lule� Energi AB|| TUES|C82065_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82065_01 - Olofstr�ms Kraft AB|| TUES|C82068_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82068_01 - V�xj� Energi AB|| TUES|C82069_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82069_01 - Kalmar Energi F�rs�ljning AB|| TUES|C82072_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82072_01 - Alings�s Energi N�t AB|| TUES|C82075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82075_01 - S�dra Hallands Kraft ek. f�r.|| TUES|C82076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82076_01 - G�vle Energi AB|| TUES|C82085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82085_01 - Ronneby Milj� och Teknik AB|| TUES|C82149_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82149_01 - Entergy Mississippi|| TUES|C82150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82150_01 - EPCOR Utilities Ltd.|| TUES|C82165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82165_01 - Reliant Energy|| TUES|C82175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82175_01 - Trans Union - Reliant Energy|| TUES|C82204_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82204_01 - Amec Foster Wheeler Energia Oy|| TUES|C82212_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82212_01 - Haminan Energia Oy|| TUES|C82227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82227_01 - Porvoon Energia Oy - Borgå En|| TUES|C82232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82232_01 - Satavakka Oy|| TUES|C82253_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82253_01 - TN - Chattanooga Electric Power Board (EPB)|| TUES|C82256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82256_01 - Duke Energy Corporation|| TUES|C82299_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82299_01 - Nassjo Affarsverk AB|| TUES|C82303_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82303_01 - Harnosand Energi & Miljo AB|| TUES|C82304_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82304_01 - ovik Energi AB|| TUES|C82306_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82306_01 - Sandviken Energi AB|| TUES|C82309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82309_01 - PiteEnergi Handel AB|| TUES|C82316_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82316_01 - Boras Elnat AB|| TUES|C82324_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82324_01 - C4 Elnat AB|| TUES|C82327_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82327_01 - Umea Energi AB|| TUES|C82333_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82333_01 - Linde Energi AB|| TUES|C82335_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82335_01 - Varberg Energi AB|| TUES|C82361_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82361_01 - AusNet Transmission Group Pty Ltd|| TUES|C82369_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82369_01 - SP AUSNET|| TUES|C82359_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82359_01 - DOWNER UTILITIES AUSTRALIA PTY LTD|| TUES|C82364_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82364_01 - Peterborough Utilities Services Inc.|| TUES|C82389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82389_01 - Peterborough Utilities Services Inc.|| TUES|C82426_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82426_01 - Guelph Hydro Inc.|| TUES|C82437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82437_01 - Low Carbon Contracts Company Limited|| TUES|C82477_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82477_01 - Electricity Supply Board|| TUES|C82478_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82478_01 - GE Grid Solutions (UK) Ltd|| TUES|C82479_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82479_01 - TMA Data Management Limited|| TUES|C82480_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82480_01 - REPOWER�� AG|| TUES|C82481_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82481_01 - Office of Gas and Electricity Markets|| TUES|C82483_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82483_01 - Market Operator Services Limited|| TUES|C82617_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82617_01 - New Hampshire Electric Co-Op|| TUES|C82618_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82618_01 - NGUSA Service Company|| TUES|C82625_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82625_01 - UNITIL SERVICE CORP.|| TUES|C82636_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82636_01 - Trans Union - Reliant Energy|| TUES|C82637_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82637_01 - Reliant Energy|| TUES|C82659_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82659_01 - State National Companies|| TUES|C82677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82677_01 - Entergy Arkansas, Inc|| TUES|C82678_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82678_01 - Florida Power & Light|| TUES|C82679_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82679_01 - We Energies|| TUES|C82680_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82680_01 - Cobb Electric|| TUES|C82682_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82682_01 - El Paso Electric Company|| TUES|C82683_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82683_01 - LG&E and KU Serv. Company-formally EON|| TUES|C82684_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82684_01 - Mid American Energy Company|| TUES|C82686_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82686_01 - WESTAR ENERGY, INC.|| TUES|C82688_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82688_01 - Wisconsin Energy|| TUES|C82689_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82689_01 - AGL RESOURCES INC.|| TUES|C82690_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82690_01 - INDIANAPOLIS POWER & LIGHT COMPANY|| TUES|C82698_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82698_01 - Entergy Mississippi|| TUES|C82724_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82724_01 - Duquesne Light|| TUES|C82743_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82743_01 - Southern Maryland Electric Cooperative|| TUES|C82744_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82744_01 - SANTEE COOPER|| TUES|C82747_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82747_01 - PEPCO HOLDINGS INC|| TUES|C82748_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82748_01 - Dominion Resources Services, Inc.|| TUES|C82752_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82752_01 - Pennsylvania Power & Light Corporation|| TUES|C82763_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82763_01 - PORTLAND GENERAL ELECTRIC|| TUES|C82765_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82765_01 - Renewable Energy Systems Ltd|| TUES|C81874_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||MMOG_Att|C81874_03 - Chugach Electric Association, Inc.|| TUES|C82776_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82776_01 - Emera Maine|| TUES|C82777_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82777_01 - Grand Bahama Power Company|| TUES|C82778_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82778_01 - Dominica Electricity Services|| TUES|C82828_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82828_01 - Sunset Power|| TUES|C82830_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82830_01 - SCHNEIDER ELECTRIC (Australia) Pty Ltd|| TUES|C82860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82860_01 - Groupe HTlios|| TUES|C82862_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82862_01 - BERMUDA ELECTRIC LIGHT COMPANY|| TUES|C82862_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82862_02 - BERMUDA ELECTRIC LIGHT COMPANY|| TUES|C82930_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82930_01 - CU Springfield|| TUES|C82931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82931_01 - Electric Power Board of Chattanooga|| TUES|C82932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82932_01 - EXELON BUSINESS SERVICES CORPORATION|| TUES|C82933_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82933_01 - Great Plains Energy Services Inc.|| TUES|C82934_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82934_01 - Indianapolis Power and Light Company|| TUES|C82935_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82935_01 - JEA|| TUES|C82936_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82936_01 - MidAmerican Energy|| TUES|C82937_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82937_01 - Montana-Dakota Utilities|| TUES|C82938_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82938_01 - Nashville Electric Service|| TUES|C82940_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82940_01 - Oklahoma Gas & Electric Company|| TUES|C82941_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82941_01 - Omaha Public Power District|| TUES|C82944_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82944_01 - AEP Service Corporation|| TUES|C82948_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82948_01 - Alstom-Grid SAS-IST|| TUES|C82956_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82956_01 - NortheastUtilitiesServiceCo.|| TUES|C82961_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82961_01 - NSTAR|| TUES|C82967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82967_01 - PSEG Long Island|| TUES|C82968_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82968_01 - PSEG Services Corporation|| TUES|C82971_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82971_01 - NSTAR|| TUES|C82972_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82972_01 - PSEG Long Island|| TUES|C82973_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82973_01 - PSEG Services Corporation|| TUES|C82982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82982_01 - Tacoma Power|| TUES|C82984_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82984_01 - Chugach Electric Association Inc.|| TUES|C82986_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82986_01 - Puget Sound Energy|| TUES|C82987_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82987_01 - NW NATURAL|| TUES|C82988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82988_01 - IDAHO POWER|| TUES|C82992_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C82992_01 - SUNSET POWER INTERNATIONAL PTY LTD|| TUES|C83007_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83007_01 - Southern Company Services Inc.|| TUES|C83008_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83008_01 - Teco Energy|| TUES|C83009_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83009_01 - We Energies|| TUES|C81406_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||GSID_Att|C81406_02 - PSEG Long Island|| TUES|C83040_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83040_01 - Unitil Corporation|| TUES|C83026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83026_01 - Orlando Utilities Commission|| TUES|C83032_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83032_01 - Louisville Gas and Electric Company|| TUES|C83034_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83034_01 - Public Service Electric & Gas|| TUES|C83036_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83036_01 - Long Island Power Authority|| TUES|C83042_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83042_01 - Idaho Power Company|| TUES|C83048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83048_01 - POWERWATER|| TUES|C83049_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83049_01 - WOOLNORTH WIND FARM HOLDING PTY LTD|| TUES|C83076_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83076_01 - American Energy Partners, LP|| TUES|C83084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83084_01 - Eversource Energy Service Co.|| TUES|C83086_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83086_01 - Liberty Energy Utilities (NH) Corp|| TUES|C83121_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83121_01 - NRG-Pro|| TUES|C83175_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83175_01 - ACTEWAGL DISTRIBUTION|| TUES|C83164_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83164_01 - BarsebSck Kraft AB|| TUES|C83183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83183_01 - National Grid USA|| TUES|C83160_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83160_01 - The Public Utility Dist NO. 1 of Cowlitz|| TUES|C83186_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83186_01 - Tranas Energi AB|| TUES|C83188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83188_01 - Vasterviks Miljo och Energi AB|| TUES|C83192_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83192_01 - Varbergsortens Elkraft Ek Forening|| TUES|C83200_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83200_01 - SkovdeNat AB|| TUES|C83203_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83203_01 - Ornskoldsviks Energi AB|| TUES|C83206_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83206_01 - Nybro Elnat AB|| TUES|C83224_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83224_01 - Alliant Energy|| TUES|C83228_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83228_01 - BES Utilities|| TUES|C83232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83232_01 - Low Carbon Contracts Company Limited|| TUES|C83248_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83248_01 - GDF SUEZ Trading|| TUES|C83259_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83259_01 - Utilities Kingston|| TUES|C83269_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83269_01 - SMART COMMS - NPOWER|| TUES|C83270_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83270_01 - SMART SERVICE - GE|| TUES|C83187_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83187_01 - Eksjo Energi AB|| TUES|C83307_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83307_01 - Nykarleby Kraftverk Ab|| TUES|C83309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83309_01 - Nykarleby Kraftverk Ab|| TUES|C83354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83354_01 - Jacksonville Electric Authority (JEA)|| TUES|C83358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83358_01 - MO - Kansas City Power & Light Company|| TUES|C83372_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83372_01 - TenneT|| TUES|C83385_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83385_01 - Jaren Everk|| TUES|C83389_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83389_01 - ALLIANT ENERGY CORP SRVCS INC|| TUES|C70439_13|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C70439_13 - OTHERS - E&U|| TUES|C83414_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83414_01 - Louisville Gas and Electric Company|| TUES|C83437_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83437_01 - EDF SA|| TUES|C83441_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83441_01 - OTHERS - E&U|| TUES|C83450_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83450_01 - Manitoba Hydro-Electric Board|| TUES|C83453_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83453_01 - Toronto Hydro Corporation|| TUES|C83472_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83472_01 - MO - Kansas City Power & Light Company|| TUES|C83574_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83574_01 - Ishavskraft AS|| TUES|C83651_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83651_01 - PPL Electric Utilities Corporation|| TUES|C83691_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83691_01 - Ceska Pojistovna|| TUES|C83692_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83692_01 - ERROR|| TUES|C83693_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83693_01 - E.ON|| TUES|C83694_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83694_01 - E.ON|| TUES|C83695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83695_01 - E.ON|| TUES|C83696_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83696_01 - E.ON|| TUES|C83697_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83697_01 - E.ON|| TUES|C83708_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83708_01 - Prime Rock Energy Capitol|| TUES|C83731_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83731_01 - ANTELOPE ENERGY|| TUES|C83734_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83734_01 - Apex Energy (PA), LLC|| TUES|C83737_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83737_01 - ARES ENERGY LTD.|| TUES|C83738_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83738_01 - ARGENT ENERGY|| TUES|C83772_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83772_01 - BLUE FLAME ENERGY COMPANY|| TUES|C83803_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83803_01 - CHROMA|| TUES|C83815_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83815_01 - CLAYTON WILLIAMS|| TUES|C83818_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83818_01 - Cobb Electric|| TUES|C83835_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83835_01 - CU Springfield|| TUES|C83842_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83842_01 - DART ENERGY|| TUES|C83855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83855_01 - Duquesne Light|| TUES|C83860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83860_01 - Electric Power Board of Chattanooga|| TUES|C83866_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83866_01 - Energy Operations Management|| TUES|C83869_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83869_01 - Entergy Mississippi|| TUES|C83871_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83871_01 - Ergon|| TUES|C83888_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83888_01 - Florida Power & Light|| TUES|C83901_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83901_01 - GREKA ENERGY (CA)|| TUES|C83918_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83918_01 - HILLWOOD ENERGY|| TUES|C83931_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83931_01 - JD Harkey Energy, LP|| TUES|C83932_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83932_01 - JEA|| TUES|C83958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83958_01 - Madison Gas and Electric|| TUES|C83967_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83967_01 - MCCOMBS ENERGY|| TUES|C83976_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83976_01 - MILLER ENERGY|| TUES|C83988_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C83988_01 - Nashville Electric Service|| TUES|C84006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84006_01 - Northeast Utilities|| TUES|C84015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84015_01 - Orlando Utilities Commission|| TUES|C84019_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84019_01 - PACESETTER ENERGY|| TUES|C84028_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84028_01 - Parsley Energy|| TUES|C84030_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84030_01 - PBF ENERGY|| TUES|C84035_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84035_01 - PI Energy Corporation|| TUES|C84054_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84054_01 - REPUBLIC ENERGY|| TUES|C84055_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84055_01 - RIDGELAKE ENERGY|| TUES|C84063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84063_01 - SAGE ENERGY COMPANY|| TUES|C84066_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84066_01 - San Diego Gas & Electric (SDG&E)|| TUES|C84082_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84082_01 - Southern Company Services Inc.|| TUES|C84084_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84084_01 - SOUTHWESTERN ENERGY CO.|| TUES|C84090_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84090_01 - Staghorn Energy, LLC|| TUES|C84105_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84105_01 - SWIFT ENERGY|| TUES|C84112_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84112_01 - Teco Energy|| TUES|C84113_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84113_01 - Tecton Energy, LLC|| TUES|C84130_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84130_01 - TRINITY RIVER ENERGY|| TUES|C84169_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84169_01 - Woodford Energy, LLC|| TUES|C84177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84177_01 - Alectra Utilities Corporation|| TUES|C84182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84182_01 - Colombo Energy, Inc|| TUES|C84227_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84227_01 - National Grid USA|| TUES|C84232_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84232_01 - Duke Energy|| TUES|C84234_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84234_01 - Entergy|| TUES|C84241_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84241_01 - Institute of Nuclear Power Operations|| TUES|C84255_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84255_01 - SCANA|| TUES|C84258_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84258_01 - Southern Company|| TUES|C84261_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84261_01 - Tennessee Valley Authority|| TUES|C84265_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84265_01 - Westinghouse Electric Company|| TUES|C84288_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84288_01 - Xcel Energy|| TUES|C84314_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84314_01 - ENERGISA MATO GROSSO DO SUL|| TUES|C84315_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84315_01 - Queiroz Galvao Energia SA|| TUES|C84350_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84350_01 - Alectra|| TUES|C84360_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84360_01 - PPL Electric Utilities Corporation|| TUES|C84394_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84394_01 - AETV PTY LTD|| TUES|C84413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUES_Att|C84413_01 - Northwest Territories Power Corporation|| Utilities|TUWA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TUWA|C11172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C11172_01 - United Utilities Water plc|| TUWA|C31366_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C31366_01 - CM Lisboa|| TUWA|C51383_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C51383_01 - Lydec|| TUWA|C51641_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C51641_01 - CLEANAWAY OPERATIONS PTY LTD|| TUWA|C51677_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C51677_01 - Xylems|| TUWA|C52048_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C52048_01 - EG-Utility A/S|| TUWA|C52095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C52095_01 - Hach Lange A/S|| TUWA|C70240_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70240_01 - Aguas de Sabadell|| TUWA|C70240_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70240_02 - Aguas de Sabadell|| TUWA|C70273_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70273_01 - CITY WEST WATER CORPORATION|| TUWA|C52178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C52178_01 - Marius Pedersen A/S|| TUWA|C52275_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C52275_01 - Silhorko-Eurowater A/S|| TUWA|C70658_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70658_01 - ESØ 90 I/S|| TUWA|C70661_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70661_01 - I/S Affaldsplus|| TUWA|C70668_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70668_01 - Verdo A/S|| TUWA|C80074_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80074_01 - New Orleans Sewer/Water|| TUWA|C80075_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80075_01 - SW Florida Water Management|| TUWA|C80093_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80093_01 - Saur|| TUWA|C80157_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80157_01 - Dwr Cymru Welsh Water|| TUWA|C80157_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80157_02 - Dwr Cymru Welsh Water|| TUWA|C80165_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80165_01 - METASPHERE LTD|| TUWA|C80172_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80172_01 - Scottish Water|| TUWA|C80177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80177_01 - United Utilities Water plc|| TUWA|C80178_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80178_01 - Veolia Water|| TUWA|C80180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80180_01 - YORKSHIRE WATER SERVICES LTD|| TUWA|C80181_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80181_01 - Anglian Water Services Ltd|| TUWA|C80182_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80182_01 - British Waterways|| TUWA|C80183_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80183_01 - Central Market Agency Ltd|| TUWA|C80185_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80185_01 - MELBOURNE WATER CORPORATION|| TUWA|C80188_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80188_01 - Sembcorp Bournemouth Water Ltd|| TUWA|C80208_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80208_01 - Dwr Cymru Welsh Water|| TUWA|C80208_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80208_02 - Dwr Cymru Welsh Water|| TUWA|C70368_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70368_01 - HONOLULU BOARD OF WATER SUPPLY|| TUWA|C70392_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70392_01 - LINKWATER (Vendor No. 100295)|| TUWA|C70408_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70408_01 - MOMENTUM ENERGY PTY LIMITED|| TUWA|C70454_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70454_01 - QUEENSLAND URBAN UTILITIES|| TUWA|C70461_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70461_01 - SA WATER CORPORATION|| TUWA|C70462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70462_01 - SABESP|| TUWA|C70489_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70489_01 - Sydney Water Corporation|| TUWA|C70489_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70489_02 - Sydney Water Corporation|| TUWA|C70491_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70491_01 - TAPCO|| TUWA|C70522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70522_01 - Veolia|| TUWA|C70523_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_01 - VEOLIA|| TUWA|C70523_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_02 - VEOLIA|| TUWA|C70523_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_03 - VEOLIA|| TUWA|C70523_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_04 - VEOLIA|| TUWA|C70523_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_05 - VEOLIA|| TUWA|C70523_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_06 - VEOLIA|| TUWA|C70523_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_09 - VEOLIA|| TUWA|C70523_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_10 - VEOLIA|| TUWA|C70523_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70523_11 - VEOLIA|| TUWA|C70535_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70535_01 - Water|| TUWA|C70538_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70538_01 - YARRA VALLEY WATER LTD (Vendor No LOG004)|| TUWA|C80854_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80854_01 - ANGLIAN WATER SERVICES|| TUWA|C80858_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80858_01 - Central Market Agency Ltd (CMA)|| TUWA|C80861_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80861_01 - DWR CYMRU WELSH WATER|| TUWA|C80893_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80893_01 - SOUTH WEST WATER Ltd|| TUWA|C80898_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80898_01 - YORKSHIRE WATER SERVICES|| TUWA|C80309_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80309_01 - Acciona Agua S.A.|| TUWA|C80599_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80599_01 - Thames_Water|| TUWA|C80644_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80644_01 - PIDPA|| TUWA|C80703_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80703_01 - PIDPA|| TUWA|C80719_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80719_01 - Dalkia France|| TUWA|C80827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80827_01 - Vivaqua|| TUWA|C81448_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C81448_01 - Water & Sewerage Authority - Trinidad & Tobago|| TUWA|C89999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C89999_02 - Other Sub Sector TUWA|| TUWA|C51331_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C51331_01 - ITT Flygt|| TUWA|C51827_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C51827_01 - Xylem|| TUWA|C70647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70647_01 - Water|| TUWA|C70257_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C70257_01 - BARWON REGION WATER CORPORATION|| TUWA|C80100_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80100_01 - Lyonnaise des eaux France|| TUWA|C80358_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80358_01 - Suzlon Energy GmbH|| TUWA|C80609_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80609_01 - Welsh_Water|| TUWA|C80719_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C80719_02 - Dalkia France|| TUWA|C81732_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C81732_01 - CLEANAWAY PTY LTD|| TUWA|C81958_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C81958_01 - AMEY GROUP SERVICES LTD|| TUWA|C81964_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C81964_01 - FL Southwest Florida Water Management District|| TUWA|C81982_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C81982_01 - FL Southwest Florida Water Management District|| TUWA|C82001_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82001_01 - NORTHUMBRIAN WATER|| TUWA|C82301_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82301_01 - Umea Vatten och Avfall AB|| TUWA|C82399_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82399_01 - Shanks|| TUWA|C82409_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82409_01 - TasWater|| TUWA|C82451_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82451_01 - HUNTER WATER CORPORATION|| TUWA|C82452_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82452_01 - Cardno Emerging Markets (Australia) Pty|| TUWA|C82687_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82687_01 - Water and Sewerage Authority|| TUWA|C82710_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82710_01 - New Orleans Sewer/Water|| TUWA|C82770_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C82770_01 - Halifax Water Commission|| TUWA|C83128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C83128_01 - SEQWATER|| TUWA|C83152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C83152_01 - Bournemouth Water Limited|| TUWA|C83233_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C83233_01 - Severn Trent Water|| TUWA|C83951_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C83951_01 - LLOG EXPLORATION CO., L.L.C.|| TUWA|C84000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C84000_01 - New Orleans Sewer/Water|| TUWA|C84104_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C84104_01 - SW FLORIDA WATER MANAGEMENT|| TUWA|C84131_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C84131_01 - TU CANADA|| TUWA|C84298_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C84298_01 - Castle Water|| TUWA|C84343_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUWA_Att|C84343_01 - ANGLIAN WATER BUSINESS (National) LTD|| Utilities|TUGA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TUGA|C11173_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C11173_01 - Wales & West Utilities|| TUGA|C22177_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C22177_01 - Total Tractebel Emirates O/M Company|| TUGA|C51189_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C51189_01 - Calor Gas|| TUGA|C51197_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C51197_01 - Centrica plc|| TUGA|C51235_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C51235_01 - Digal Gas|| TUGA|C51026_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C51026_01 - Northwest Natural Gas Company|| TUGA|C51180_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C51180_01 - Bord Gais|| TUGA|C51718_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C51718_01 - Gas Natural BAN S.A.|| TUGA|C70254_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70254_01 - AUSTRALIAN ENERGY MARKET OPERATOR LTD|| TUGA|C70308_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70308_01 - Eesti Gas|| TUGA|C70660_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70660_01 - Frederiksberg Forsyning A/S|| TUGA|C70663_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70663_01 - Naturgas Fyn I/S|| TUGA|C80031_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80031_01 - Yankee Gas Services Company|| TUGA|C80031_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80031_02 - Yankee Gas Services Company|| TUGA|C80053_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80053_01 - Cofely|| TUGA|C80053_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80053_02 - Cofely|| TUGA|C80053_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80053_03 - Cofely|| TUGA|C80061_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80061_01 - Gaz de France|| TUGA|C80061_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80061_02 - Gaz de France|| TUGA|C80061_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80061_03 - Gaz de France|| TUGA|C80063_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80063_01 - Enbridge|| TUGA|C80063_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80063_02 - Enbridge Gas New Brunswick|| TUGA|C80063_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80063_03 - Enbridge|| TUGA|C80063_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80063_04 - Enbridge Gas Distribution Inc|| TUGA|C80071_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80071_01 - Gaz Métro|| TUGA|C80095_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80095_01 - Gaz Metro (Capgemini)|| TUGA|C80099_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80099_01 - SaskEnergy|| TUGA|C80108_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80108_01 - Mountaineer Gas Services|| TUGA|C80115_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80115_01 - Gas Div of the Narragansett Electric Co|| TUGA|C80115_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80115_02 - Gas Div of the Narragansett Electric Co|| TUGA|C80123_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80123_01 - Superior Propane|| TUGA|C80124_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80124_01 - Union Gas Limited|| TUGA|C80128_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80128_01 - Alagasco|| TUGA|C80128_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80128_02 - Alagasco|| TUGA|C80128_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80128_03 - Alagasco|| TUGA|C80143_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80143_01 - Citizens Gas & Coke Utility (CGCU)|| TUGA|C80143_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80143_02 - Citizens Gas & Coke Utility (CGCU)|| TUGA|C80143_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80143_03 - Citizens Gas & Coke Utility (CGCU)|| TUGA|C80150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80150_01 - Veresen Inc|| TUGA|C80152_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80152_01 - New Jersey Natural Gas|| TUGA|C80152_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80152_02 - New Jersey Natural Gas|| TUGA|C80190_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80190_01 - Washington Gas Light Company Inc|| TUGA|C70323_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70323_01 - ENE|| TUGA|C70346_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70346_01 - Fluxys|| TUGA|C70352_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_01 - GDF SUEZ|| TUGA|C70352_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_02 - ENGIE|| TUGA|C70352_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_03 - ENGIE|| TUGA|C70352_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_04 - GDF SUEZ|| TUGA|C70352_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_05 - GDF SUEZ|| TUGA|C70352_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_06 - GDF SUEZ|| TUGA|C70352_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_07 - GDF SUEZ|| TUGA|C70352_09|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_09 - ENGIE|| TUGA|C70352_10|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_10 - ENGIE|| TUGA|C70352_11|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_11 - ENGIE|| TUGA|C70352_12|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70352_12 - ENGIE|| TUGA|C70386_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70386_01 - Københavns Energi A/S|| TUGA|C70413_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70413_01 - Naturgas|| TUGA|C70458_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70458_01 - RETAIL ENERGY MARKET COMPANY LTD|| TUGA|C80855_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80855_01 - Bord Gais Networks|| TUGA|C80856_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80856_01 - BRITISH GAS TRADING Ltd|| TUGA|C80859_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80859_01 - CENTRICA|| TUGA|C80860_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80860_01 - COFELY|| TUGA|C80885_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80885_01 - Northern Gas Networks|| TUGA|C81011_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81011_01 - Bord Gais|| TUGA|C81015_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81015_01 - CALOR GAS|| TUGA|C81016_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81016_01 - CENTRICA|| TUGA|C80256_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80256_01 - Alabama Gas Corporation|| TUGA|C80356_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80356_01 - Ohra Energie GmbH|| TUGA|C80506_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80506_01 - British_Gas|| TUGA|C80600_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80600_01 - Total_Gas_&_Power|| TUGA|C80647_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80647_01 - TENIX ALLIANCE PTY LTD|| TUGA|C80688_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80688_01 - Semco Energy Inc.|| TUGA|C80688_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80688_02 - Semco Energy Inc.|| TUGA|C81236_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81236_01 - GDF SUEZ AUSTRALIAN ENERGY|| TUGA|C81421_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81421_02 - New Jersey Resources Corporation|| TUGA|C81455_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81455_01 - Prestiteca - Engenharia e Tecnologia|| TUGA|C81462_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81462_01 - Naturgas|| TUGA|C89999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C89999_03 - Other Sub Sector TUGA|| TUGA|C11173_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C11173_02 - Wales & West Utilities|| TUGA|C70276_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C70276_01 - Compagas|| TUGA|C81510_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81510_01 - AGL|| TUGA|C80860_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80860_02 - COFELY Holding|| TUGA|C60336_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C60336_01 - JEMENA GAS NETWORKS (NSW) LTD|| TUGA|C80014_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80014_01 - Direct Energy|| TUGA|C80101_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80101_01 - Cofely|| TUGA|C80142_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80142_01 - Southern Union Gas Services|| TUGA|C80148_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80148_01 - New England Gas (NEG)|| TUGA|C80148_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80148_02 - New England Gas (NEG)|| TUGA|C80148_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80148_03 - New England Gas (NEG)|| TUGA|C80148_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80148_04 - New England Gas (NEG)|| TUGA|C81421_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81421_01 - New Jersey Resources Corporation|| TUGA|C51695_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C51695_01 - GasTerra B.V|| TUGA|C60325_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C60325_01 - Piedmont Natural Gas Company, Inc.|| TUGA|C80688_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80688_03 - Semco Energy Inc.|| TUGA|C81823_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81823_01 - Gasterra|| TUGA|C81838_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81838_01 - Gasunie|| TUGA|C80688_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C80688_04 - SEMCO ENERGY, Inc.|| TUGA|C81920_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81920_01 - AGL RESOURCES INC.|| TUGA|C81927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81927_01 - APA Group|| TUGA|C81999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C81999_01 - GDF Suez Energy UK|| TUGA|C82000_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82000_01 - Total Gas & Power Ltd|| TUGA|C82267_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82267_01 - Superior Propane|| TUGA|C82354_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82354_01 - EPIC ENERGY SOUTH AUSTRALIA PTY LTD|| TUGA|C82522_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82522_01 - WINGAS GmbH|| TUGA|C82749_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82749_01 - Washington Gas Light Company|| TUGA|C82751_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82751_01 - Piedmont Natural Gas Company, Inc.|| TUGA|C82927_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82927_01 - Alagasco|| TUGA|C82928_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82928_01 - Citizens Gas|| TUGA|C82929_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82929_01 - Citizens Gas|| TUGA|C82942_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82942_01 - ONE Gas, Inc.|| TUGA|C82960_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82960_01 - New Jersey Resources Corporation|| TUGA|C82970_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C82970_01 - New Jersey Resources Corporation|| TUGA|C83006_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83006_01 - SEMCO Energy|| TUGA|C83027_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83027_01 - People Gas Light and Coke co|| TUGA|C83089_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83089_01 - Gas Networks Ireland|| TUGA|C83085_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83085_01 - New Jersey Natural Gas|| TUGA|C83289_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83289_01 - ENGIE|| TUGA|C52341_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C52341_01 - Southwest Gas|| TUGA|C83446_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83446_01 - Alabama Gas Corporation|| TUGA|C83456_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83456_01 - ENGIE|| TUGA|C83602_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83602_01 - Alabama Gas Corporation|| TUGA|C83715_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83715_01 - AGL RESOURCES INC.|| TUGA|C83716_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83716_01 - Alagasco|| TUGA|C83877_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C83877_01 - Exploration & Production Canada EPW|| TUGA|C84150_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C84150_01 - VISTA RESOURCES, INC.|| TUGA|C84371_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||TUGA_Att|C84371_01 - Northwest Natural Gas Co.|| Client_by_Vertical|No_Sectors|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total C99998-C99999|| No_Sectors|C99998|NeverShare|Y|Y|N|N|||+|||||Unspecified||||PSA Time Accrual|| C99998|C99998_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99998_01 - PSA Time Accrual|| C99998|C99998_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99998_02 - PSA Time Accrual - CA211|| C99998|C99998_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99998_03 - PSA Time Accrual - CA212|| C99998|C99998_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99998_04 - PSA Time Accrual - CA271|| C99998|C99998_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99998_05 - PSA Time Accrual - CA214|| C99998|C99998_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99998_06 - PSA Time Accrual - CA258|| C99998|C99998_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99998_07 - PSA Time Accrual - CA213|| No_Sectors|C99999|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Others|| C99999|C99999_01|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_01 - Other - Blank|| C99999|C99999_02|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_02 - Other - CA211|| C99999|C99999_03|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_03 - Other - CA212|| C99999|C99999_04|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_04 - Other - CA271|| C99999|C99999_05|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_05 - Other - CA214|| C99999|C99999_06|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_06 - Other - CA258|| C99999|C99999_07|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_07 - Other - CA213|| C99999|C99999_08|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|C99999_08 - Other - US209|| Client_by_Vertical|To_be_Classified|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Clients to be classified by Marketing Team|| To_be_Classified|Blank|NeverShare|Y|Y|N|N|||+|||||Unspecified|||To_be_Classified_Att|Blank (do not reclass)|| #root|Client_by_BU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_GMA_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GMA_Total|BU_GMA_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GMA_Parent|BU_GM_CPS_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Total|BU_GM_CPS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10744_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50025_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C99998_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C99999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10106_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10152_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10318_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10400_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10518_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10697_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C11008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C11049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C20061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30271_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30337_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30659_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30677_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30866_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30936_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C31019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C31056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C31099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50030_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50033_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50102_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50375_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50532_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C60051_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C60062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C60126_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C60138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C60140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C70003_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C70011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C70037_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C70042_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C70168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C70205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C51094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C99998_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C99999_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C40219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50030_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50306_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50371_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C60051_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C51732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C60225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30294_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10959_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C31168_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10843_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10570_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50452_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80742_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81495_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80688_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80812_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30966_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81874_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C50946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C51001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C10353_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C70029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C99998_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C99999_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C30813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80031_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C31263_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C80688_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C99999_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C81188_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C82862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C83637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS|C84380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Total|BU_GM_CPS_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20549_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20861_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C21881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20063_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C21145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30050_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30646_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30192_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30673_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30647_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20871_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30843_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60081_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10704_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10803_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10007_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10157_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10852_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11012_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80249_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80006_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80010_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80027_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80092_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80115_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80128_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50323_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50486_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C51014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70042_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31056_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10870_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50492_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30731_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80032_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10011_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10106_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10445_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10486_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20002_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20076_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20169_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30098_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30313_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50017_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50102_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50445_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50491_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50532_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50554_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50659_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60067_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80001_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80126_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10018_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10025_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10032_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10223_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10385_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10567_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10879_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20047_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20100_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20196_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20439_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20693_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20728_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20855_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C21012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C21880_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30098_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30267_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31175_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40048_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C40230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50018_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50025_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50034_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50434_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50445_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50509_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50543_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50957_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C51006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C51025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70188_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70219_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50017_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70003_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C51378_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31799_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81171_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C31040_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C81870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C82468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C82560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C82563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C82796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C82849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C82857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C82860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10114_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10477_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C10814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20002_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20076_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20076_18|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20076_19|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20076_20|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20127_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20193_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20313_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C20514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30163_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30198_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30337_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C60061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C70017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C11012_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C21880_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C30731_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80135_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80148_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C50875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80079_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80452_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C80152_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GM_CPS_Inactive|C83450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_Parent|BU_GMA_FIN_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Total|BU_GMA_FIN|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C99998_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C99999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_21|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_22|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_23|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20088_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20257_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20317_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20650_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C21134_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C21841_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C21917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C21841_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20257_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20866_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C80744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C80371_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20899_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20852_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C11153_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C82784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C99998_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C99999_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_15|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_16|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_17|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20728_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C99998_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C99999_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10114_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10399_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20061_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20076_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20257_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20317_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C20871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C31280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50309_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50521_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50580_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C50957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C60004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C60006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C60037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C60056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C60071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C60101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C60143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C11104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C51732_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C30155_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C81979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C10059_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C51746_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C82566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN|C83638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Total|BU_GMA_FIN_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10318_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10397_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10477_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10711_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10753_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10793_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C11003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C11059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20135_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20234_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20391_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20549_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20657_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C21007_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C21017_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C21779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C21797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30332_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30620_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30687_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30926_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31103_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31131_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C40086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C40099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C40101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50017_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50033_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50039_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50102_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C51047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C51067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C51079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60015_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C70024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C70221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C21932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10165_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10197_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50005_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31159_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C51132_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81521_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C80261_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C82486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C82487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20221_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20135_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20725_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20870_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C31285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50177_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20002_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20318_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20483_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20546_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C20607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C10870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C21033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C30148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C40166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50016_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C50916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C51000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C60101_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C70160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_FIN_Inactive|C81975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_Parent|BU_GMA_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C81223_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C10106_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C10448_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C11012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C20433_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C21880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C30813_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C31250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C31263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C50105_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C50309_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C50509_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C50875_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C51026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80002_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80009_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80013_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80016_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80018_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80023_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80024_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80025_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80029_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80031_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80033_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80034_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80035_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80036_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80038_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80040_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80045_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80046_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80047_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80052_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80090_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80097_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80109_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80118_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80128_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80129_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80135_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80137_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80143_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80148_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80151_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C31794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C70037_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80688_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C80224_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C81188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C81384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C81406_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C81421_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C20257_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C20076_30|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C81874_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C82042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C82427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C50554_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C82546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C82862_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GMA_USD|C83014_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_GTO_T1_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Parent|BU_GTO_T1_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Total|BU_GTO_T1_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C80342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10011_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10013_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10017_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10025_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10106_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10218_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10382_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10477_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10486_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10744_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10768_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10779_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C11039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C11072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20020_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20026_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20062_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20076_27|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20088_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20101_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20105_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20134_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20205_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20221_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20283_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20285_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20317_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20319_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20344_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20373_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20481_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20494_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20538_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20659_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20690_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20693_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20824_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20871_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21134_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21883_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21884_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30044_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30081_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30089_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30263_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30283_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30298_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30337_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30785_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30842_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C31172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C31292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50018_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50025_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50025_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50033_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50142_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50309_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50554_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50580_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50708_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50860_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C51034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C60017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C60032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C60093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C60102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C70003_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C70003_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C70083_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C70130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C80014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C80022_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C80058_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10152_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10032_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10022_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10150_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10247_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10311_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20106_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20317_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20365_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21007_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C21841_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C30294_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C31056_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C40219_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50017_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50030_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50306_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C60024_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C60051_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C70037_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20257_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C81192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20368_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20063_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C20494_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50025_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C50371_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10397_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Inactive|C10997_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Total|BU_GTO_T1|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1|C20011_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1|C31031_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1|C51027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1|C51027_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1|C81540_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1|C10874_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1|C70003_23|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_Parent|BU_GTO_T1_USD_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_USD_Total|BU_GTO_T1_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_USD_Total|BU_GTO_T1_USD_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_USD_Inactive|C20538_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_USD_Inactive|C50019_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_USD_Inactive|C50034_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_T1_USD_Inactive|C50181_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_GTO_DMS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10243_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10247_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10259_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10397_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10426_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10483_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10518_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10744_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10959_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C11050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20050_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20051_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20076_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20135_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20154_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20169_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20179_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20234_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20248_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20250_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20257_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20317_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20353_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20365_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20475_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20528_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20728_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20764_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20871_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C21134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C21167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C21804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C21836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30033_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30043_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30050_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30082_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30083_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30085_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30086_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30089_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30175_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30178_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30186_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30192_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30196_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30198_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30237_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30271_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30276_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30288_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30294_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30298_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30337_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30387_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30641_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30641_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30641_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30662_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30785_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30843_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C31056_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C31158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C40131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C40219_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50005_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50019_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50019_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50323_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50580_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50897_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C60032_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C60137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C70003_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C70007_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C70008_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C70037_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C70042_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C80022_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20899_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10106_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10832_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C60314_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20766_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C52344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C80312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10311_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C80696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C70003_24|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20397_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C31031_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30336_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10397_15|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50025_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C21780_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50017_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C20101_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C50504_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10959_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81348_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C31159_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30777_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30920_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C30682_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C31040_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C81683_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C10382_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTO_DMS|C82843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_Quebec_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Total|BU_Quebec|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C10311_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C10399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C10789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C10912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C10989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C20061_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C20076_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C20285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C20317_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C20528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C21841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C21914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30050_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30098_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30192_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30196_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30264_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30788_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30846_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30935_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C31081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C31155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C31278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C31284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C40095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C50733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C60129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C70003_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C31321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C30666_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C20766_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C80311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C80413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C80639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C80731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C81336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C81443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C81566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C81608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C81699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C81748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C82033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C82343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C82346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C82551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C82845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C83613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C84225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C84381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C84382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec|C84403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Total|BU_Quebec_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10128_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10221_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10639_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C11009_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C11019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C11025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20169_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20234_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20528_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20765_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20866_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30089_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30141_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30199_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30648_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30656_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30658_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30677_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30785_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40070_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50027_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50309_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50877_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C50962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C51007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C51068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C60117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C70006_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C70037_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C70194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20893_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C60169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10760_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C10311_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C20317_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C60215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C60315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30036_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C30096_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C11193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C22352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C31810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C40018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C80475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C80476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C80799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C81249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C81352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C81533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C81613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C81936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C82344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Quebec_Inactive|C82345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_NCR_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Total|BU_NCR|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10032_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10247_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10255_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10397_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10397_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10498_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C10987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C21017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30008_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30098_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30238_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30261_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30263_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30263_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C40056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C40220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C70023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C70171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C70206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C70217_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C70225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C70229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C60163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C20106_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C60212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C60213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C52342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80248_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C80656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30945_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C81708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C31076_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C82877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C11042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C30927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C83594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C84174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C84318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C84319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C84320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C84321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C84322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR|C84323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Total|BU_NCR_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10318_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10408_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C20168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C20176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C20391_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C21134_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C21838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C21922_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30041_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30134_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30135_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30150_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30258_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30270_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30288_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30310_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30392_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30837_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30840_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30901_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C40062_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C40076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C40087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C40226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C50729_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C51024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C51036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C60148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C60159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C70191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C70202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C70207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10247_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C60214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C60230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C60314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C60314_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C50361_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C10003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30263_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C80287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C80320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C60015_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C80405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C80652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C80791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C11022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30263_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C30833_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C70003_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C31314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C81888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C82396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C82864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C82878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C83021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C83113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_NCR_Inactive|C83295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_GTA_CPS_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Parent|BU_GTA_CPS_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Total|BU_GTA_CPS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C10022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||test desc| BU_GTA_CPS|C10150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C10186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C10880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C10997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20026_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20163_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20169_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20205_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20250_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20326_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20481_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20494_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20494_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20689_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C20899_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C21043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C21132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C21866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C21873_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C21915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C21928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C22340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C30188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C30190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C30811_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C30842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C30987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C31173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C31254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C31306_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C40038_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C40075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C40097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C40184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C40200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C50181_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C50207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C50589_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C60002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C60024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C60024_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C60032_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C60102_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C60121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70001_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70003_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70003_19|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70003_21|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70006_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70037_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70037_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70127_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C70146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C80020_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C80063_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C80119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C80184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C80671_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C80733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81742_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C82844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C81331_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C83592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS|C84354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Total|BU_GTA_CPS_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10011_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10017_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10022_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10088_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10090_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10247_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10318_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10334_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10372_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10382_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10486_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10518_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20009_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20020_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20028_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20048_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20050_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20063_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20105_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20134_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20145_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20179_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20199_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20227_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20230_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20291_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20317_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20373_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20379_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20486_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20509_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20533_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20539_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20626_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20637_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20668_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20685_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20693_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20764_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20765_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20866_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20892_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20899_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21841_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C22351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30757_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31175_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31265_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40086_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50102_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50142_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50178_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50309_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50445_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50491_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50707_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C51010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C51016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C51016_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C51058_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60122_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60159_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60216_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70003_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70003_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70003_25|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70022_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70128_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80020_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80022_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80773_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C82043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C82364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C82390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10032_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10165_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20368_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50309_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60122_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70227_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80022_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80745_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10978_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C10979_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20539_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21845_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C30778_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31276_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C40184_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C50848_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C51035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C51045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C51058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60102_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60104_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60124_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80148_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80371_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C11006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C20445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C21933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60121_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70003_20|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C70043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C80795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81439_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C81969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C82549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C82999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C83000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C31122_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C60142_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C83144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C83147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C83261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Inactive|C83470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_Parent|BU_GTA_CPS_USD_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_USD_Total|BU_GTA_CPS_USD_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_USD_Inactive|C60132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_USD_Total|BU_GTA_CPS_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_USD|C20368_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_USD|C40075_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_USD|C50181_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_CPS_USD|C80063_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_GTA_BKS_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Parent|BU_GTA_BKS_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Total|BU_GTA_BKS_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20101_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20237_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20323_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20327_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20401_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20549_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20549_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20599_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C80921_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20107_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C20363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C21912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C83023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C83132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Inactive|C83131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Total|BU_GTA_BKS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20011_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20057_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20071_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20073_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20074_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20076_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20234_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20304_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20349_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20462_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20481_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20615_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C20902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C21007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C21039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C21044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C21122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C21786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C21822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C21867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C60229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C81125_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C82392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C82471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C83148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C83454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C83580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C84311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C84402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS|C84415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_Parent|BU_GTA_BKS_USD_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Total|BU_GTA_BKS_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD|C20071_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD|C20378_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD|C20462_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD|C20584_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD|C20599_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD|C20615_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD|C21852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Total|BU_GTA_BKS_USD_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20073_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20076_29|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20135_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20363_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20481_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20549_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C21934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C80371_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20549_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_GTA_BKS_USD_Inactive|C20074_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_Atlantic_SCU_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Total|BU_Atlantic_SCU_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C10017_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C10567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C10568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C10820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C10855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C10889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20154_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20257_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20368_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20374_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20393_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C20735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C21785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C21806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C21916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30132_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30838_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C31151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C31281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C40125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C40164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C40193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C40194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C51044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C60080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C60081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C70003_18|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C70165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C70231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C80063_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C31324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C80154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C60210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C11186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C31806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C80424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C80695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C81147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C81180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C10842_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C30232_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Inactive|C31173_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU_Total|BU_Atlantic_SCU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C10582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20016_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20179_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20221_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20376_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20382_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20429_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20445_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20871_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C21120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C21121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C21135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C21171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C21178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C21912_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C31031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C31046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C31170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C31190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C40118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C50411_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80030_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30889_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C60211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C40330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C70612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20303_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C20622_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80757_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80758_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80760_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C80763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81503_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81596_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C30096_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C82780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C83064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C21162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C81318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C84175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Atlantic_SCU|C84176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_West_Canada_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Total|BU_West_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada|BU_Calgary|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C10874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C20901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C30922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C40053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C40078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50578_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C50996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C70160_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C70166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C60164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C70217_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C70598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C70608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C70609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C70610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C20613_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C80732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81745_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C81941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C51035_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C82446_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C82447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C82473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C83599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Calgary|C84413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada|BU_Edmonton|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C82290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C81538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C11069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C21791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C30799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C31143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C31159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C31191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C40053_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C80063_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C80120_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C20107_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C20445_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C81298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C40197_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C81458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C81690_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C81203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C81944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C81981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C82254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C82548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C82798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C83053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C83118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C83581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Edmonton|C83706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada|BU_Regina|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C82348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C81532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C10512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C21137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C21813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C30008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C30147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C30147_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C30852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C30970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C31178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C40225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C50337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C51032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C51066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C51083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C70026_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C80043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C80099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C20078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C80672_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C80777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C81564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C81693_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C81698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C30782_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C81903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C82242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C82349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C82350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C83078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C83120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Regina|C83616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada|BU_British_Columbia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C84372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C10030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C10747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C10812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C10992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C11030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C11032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30186_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C30968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C40175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C40235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C50020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C50282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C80144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C52346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C80303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C20177_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C80738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C80743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C80764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C80765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C31030_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C81970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C82397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C82398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_British_Columbia|C83707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Total|BU_West_Canada_Inactives|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11021_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30318_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50730_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70085_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20023_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30098_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30135_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21895_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21044_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C40102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10570_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20120_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20163_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20503_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31292_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C40092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50860_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70003_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31314_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C82488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C83107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C83119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C70597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11021_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C52345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C52347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C51087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C11105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C21179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50268_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80022_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31306_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C20057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30318_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C30800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C31196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C40057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C40227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C50797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C80130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C60220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C10992_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C81694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_West_Canada_Inactives|C82797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_CIA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10019_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10114_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10223_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10477_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10594_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10721_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10760_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C10883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C11031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20063_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20076_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20088_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20103_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20169_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20234_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20234_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20257_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20285_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20317_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20319_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20379_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20650_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20734_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20763_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20765_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20871_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C20883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C21035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C21124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C21125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C21126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C21127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C21128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C21133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30085_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30141_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30145_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30150_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30157_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30163_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30199_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30263_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30271_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30336_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30337_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30846_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30901_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30935_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C30976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C31056_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C50421_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C50445_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C50804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C50811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C50884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C51033_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C51048_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C60062_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C70001_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C70003_16|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C70085_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C70181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C80071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CIA|C80072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_Innovapost|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10247_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10247_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10247_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10247_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10382_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10382_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10397_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10397_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10397_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10397_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Innovapost|C10397_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Canada|BU_EVP_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_Canada|C11002_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_USA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USA|BU_Federal|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Federal|BU_HCP_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Total|BU_HCP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30548_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30551_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30551_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30579_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30783_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30783_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30783_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30783_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30838_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31212_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C40233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C40234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30783_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C80389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C81911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30875_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C81983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C81995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C81997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C30783_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP|C31799_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Total|BU_HCP_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C10926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20114_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C20889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C21887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30035_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30035_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30244_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30252_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30579_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30702_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30702_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30716_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30718_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30741_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30763_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30804_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31030_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31084_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31187_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31213_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31218_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31219_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31220_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31221_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31222_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C31308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40233_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C40238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C60089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C60090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C60114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C70160_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C80073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C70600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C60076_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C22341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C22342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C80212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C80238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C80798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C81540_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_HCP_Inactive|C30560_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Federal|BU_DEF_GSS_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Total|BU_DEF_GSS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31218_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31221_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31222_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31218_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31219_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31221_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31222_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C60331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C60342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C80828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31242_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C30723_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C30723_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31218_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31221_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31212_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31212_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C81961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS|C31084_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Total|BU_DEF_GSS_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31219_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31220_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31084_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31220_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31385_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C30581_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81483_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31199_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C30581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C30723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31042_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31084_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31138_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31220_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31222_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C30581_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31212_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31218_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31221_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31805_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31797_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80746_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31138_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C30723_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C81279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80398_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C80399_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31086_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_DEF_GSS_Inactive|C31091_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Federal|BU_SAJE_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Total|BU_SAJE|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30093_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30097_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30327_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30561_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30578_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30578_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30580_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30583_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C31042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C31311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30327_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30097_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30548_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C30618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C31222_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE|C80391_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Total|BU_SAJE_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C30097_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C30097_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C30097_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C30552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C30618_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31084_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31219_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31220_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C80455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C30548_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C80664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C80663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C80778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C81167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C31796_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C80663_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C81483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C81691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C81278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_SAJE_Inactive|C81316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Federal|BU_RAP_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Total|BU_RAP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30579_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30547_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30547_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30547_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30547_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30578_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30578_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C31017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C31017_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C31068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C31083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C31090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C31210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C21930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C31315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C80454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C30055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C83012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP|C83106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Total|BU_RAP_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C30578_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C30578_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C31041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C31305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C31318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C31599_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C80453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C80790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C80821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C81310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C81378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C81689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C81939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_RAP_Inactive|C81940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Federal|BU_IDAC_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Total|BU_IDAC|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C20661_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30546_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30546_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30830_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30830_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C30929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C31262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C40108_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C80391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C81486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C81522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C81571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C83005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C83013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C83600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C83601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C83611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C83612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C84223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC|C84349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Total|BU_IDAC_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30546_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C30981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31193_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31219_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C31599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C80822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_IDAC_Inactive|C81553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Federal|BU_FGM|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_FGM|C31084_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGM|C31218_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGM|C31219_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGM|C31220_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGM|C31221_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGM|C31222_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USA|BU_USEM|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_ISBU_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Total|BU_USEM_ISBU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C10516_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C10675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C10677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C10952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C10983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C11033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20035_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20068_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20073_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20074_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20075_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20076_26|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20091_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20131_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20134_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20138_15|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20155_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20226_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20235_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20241_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20243_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20261_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20262_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20272_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20306_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20337_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20364_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20404_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20406_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20451_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20462_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20481_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20539_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20585_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20587_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20587_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20587_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20599_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20601_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20611_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20614_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20623_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20656_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20714_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20804_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20808_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20813_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20819_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20840_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21027_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21030_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21032_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21143_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21145_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21154_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21157_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21161_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21856_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30009_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30029_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30035_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30052_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30058_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30077_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30093_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30108_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30130_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30140_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30168_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30170_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30201_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30219_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30236_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30245_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30248_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30252_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30257_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30304_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30306_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30311_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30359_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30361_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30373_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30373_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30576_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30611_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30617_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30731_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30742_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30827_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30883_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30914_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31044_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40015_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40023_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40028_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40029_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40029_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40038_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40075_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40173_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40177_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40178_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40178_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40179_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40181_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40182_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40186_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40199_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40201_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40208_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40209_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40212_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40217_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40222_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40223_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C50247_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C50508_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C50578_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C50836_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C50882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C60066_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C70001_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C70025_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C70126_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C70158_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C70187_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80015_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80046_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80065_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21798_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40187_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C60218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C60232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20567_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20227_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80052_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C40184_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21840_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21924_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20069_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20263_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20280_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C11191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C11192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C52341_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20752_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C10004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20291_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30363_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80013_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20026_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20833_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20590_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80702_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20534_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20575_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80097_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20045_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20071_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20138_19|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20337_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C60219_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C11106_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31682_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31682_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21982_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21985_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21987_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22312_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22096_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22097_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22097_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22331_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22143_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C11164_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22193_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C22043_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21962_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20076_28|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21152_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C60231_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20491_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80029_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C50578_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80215_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20500_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20624_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C70217_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C30592_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20897_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81492_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81697_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80466_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C50578_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80452_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80457_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80943_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20804_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21934_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81701_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C20549_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C80047_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C21895_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C31369_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82760_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C81943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C82762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C83140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C83152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU|C84335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Total|BU_USEM_ISBU_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10692_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20072_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20077_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20138_16|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20138_17|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20227_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20507_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20584_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20611_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20653_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20707_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20715_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20849_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21139_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30052_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30122_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30379_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30758_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30918_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31026_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40173_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40182_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40202_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40213_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50189_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C51060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70035_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70041_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70112_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70159_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80107_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20074_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20135_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21783_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80002_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20472_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C22297_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70188_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20246_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21789_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C22300_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21988_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21996_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C22082_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21790_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81163_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21850_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20161_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81187_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C81933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80688_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C82373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10134_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10306_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10437_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10674_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10720_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10888_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10913_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C10976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C11034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C11040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C11077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20007_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20020_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20020_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20035_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20042_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20055_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20055_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20055_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20062_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20066_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20139_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20194_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20255_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20304_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20319_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20324_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20339_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20401_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20418_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20446_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20498_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20587_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20609_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20615_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20619_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20630_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20638_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20640_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20643_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20647_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20648_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20789_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20812_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20826_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20908_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21032_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21149_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21159_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21160_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21800_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21832_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30011_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30027_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30035_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30037_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30038_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30047_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30057_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30079_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30093_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30140_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30152_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30205_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30216_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30235_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30246_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30247_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30272_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30287_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30303_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30312_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30345_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30352_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30353_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30354_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30356_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30357_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30537_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30542_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30614_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30727_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30745_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30751_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30756_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30807_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30830_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30887_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30893_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30906_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C30925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31029_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31039_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31049_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40004_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40004_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40024_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40024_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40183_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40192_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40207_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40214_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C40221_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50040_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50247_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50578_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50805_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50836_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C50961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C51040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C60107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C60136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70010_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70018_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70040_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70051_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70055_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70074_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70085_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70129_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70147_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80042_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80079_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80089_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80094_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80116_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80038_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C60324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C22345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80143_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80151_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C31065_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80249_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80016_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C20213_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C21796_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C80678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_ISBU_Inactive|C70546_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_New_England|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83495_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83503_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C80697_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C20292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C21855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C60147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C20357_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C20500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C20404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C40217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C50581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C30165_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C30877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C30307_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C20898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C82625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C83646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C84227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C84324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C84352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_New_England|C84364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_Central_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Total|BU_USEM_Central|StoreData|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82757_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C10436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20138_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20138_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20148_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20183_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20261_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20601_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C21160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C21782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30029_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30053_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30301_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30369_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C31024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C31296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C50247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C50421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C50600_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C50921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C60115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C60125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C70230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C50578_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C70593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C70595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C70602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C10570_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C40408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C22349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C50882_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80373_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C81230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C81431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C81445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C31065_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C81946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20337_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82688_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82690_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82697_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82702_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C82942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20068_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C20131_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C30219_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C40010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C40017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C40181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C50836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80096_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C80189_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83718_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83742_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83745_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83753_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83754_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83757_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83758_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83760_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C83999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central|C84406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Total|BU_USEM_Central_Inactive|StoreData|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20020_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20601_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20789_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20879_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C30245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C30304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C30344_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C30592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C30748_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C30754_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C30809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C31045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C31048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C31106_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C31198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C50027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C50782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C50854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C50910_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C60110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C60116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C60141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C70001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C70085_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C31793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C80725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C10670_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20549_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C21934_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C81168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C81287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C81567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C81701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C81738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C81901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C50253_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C81963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C82939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C40024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C20539_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||999| BU_USEM_Central_Inactive|C83137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|C83223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive|BU_USEM_Central_Inactive_Temp|StoreData|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10032_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10436_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10458_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10516_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10692_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C11020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C11081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20007_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20035_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20049_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20066_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20071_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20072_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20073_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20074_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20075_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20075_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20076_25|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20077_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20091_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20132_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20138_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20139_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20139_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20145_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20145_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20194_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20235_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20239_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20241_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20243_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20304_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20364_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20367_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20401_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20406_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20462_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20481_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20587_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20609_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20611_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20611_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20615_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20623_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20624_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20630_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20638_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20640_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20647_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20648_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20653_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20656_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20660_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20669_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20707_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20714_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20715_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20733_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20813_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20826_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20856_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21025_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30030_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30052_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30124_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30306_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30308_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30342_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30373_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30610_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30702_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30716_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30731_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30732_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30743_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30747_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30757_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30758_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30758_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30779_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30810_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30827_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30837_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30902_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30975_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30980_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30985_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31008_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31098_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40178_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50019_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50115_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50453_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50715_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50805_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50899_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50905_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C60066_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C60068_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C60123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C60131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C60160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70001_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70003_17|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70010_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70013_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70018_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70025_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70027_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70035_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70051_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70055_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70074_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70112_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70126_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70129_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70159_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80011_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80015_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80042_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80079_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80094_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80113_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C21931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C11098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C11102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C51105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50741_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31693_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C60231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C70611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C60322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C11190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C50140_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C40006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80002_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C10828_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30244_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30696_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30709_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30763_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30887_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C30981_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C31802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C80473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C20235_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C81964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C82420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C82534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C82535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C82536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Central_Inactive_Temp|C82537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_South|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C70158_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20227_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20539_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20619_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C21154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C21839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30746_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C31036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C50453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C70001_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C70132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C70204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C51733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C80215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30730_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C80409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30010_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C81388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C81517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C80676_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82672_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82693_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C20155_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C40007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C40029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C40182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C70041_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83446_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C50415_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C60339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C51731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C81918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82745_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C82812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C30345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83702_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C83703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_South|C84414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_East_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Total|BU_USEM_East|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82758_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30783_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C10767_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C10768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C10833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20062_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20262_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20368_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20650_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20882_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C21790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C21832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C21840_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30108_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30228_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30688_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30735_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C31005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C31148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C31162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C31301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C60152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C70085_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C31317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20051_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20151_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20296_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20344_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20426_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20472_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C21783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C21796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C31139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C60005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C22300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C80252_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C31799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C80222_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C40016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C11095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C51378_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C80472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C80770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20451_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C81215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C20051_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C80660_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C81520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C81545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C81863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C30228_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C81965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C81063_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C82977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83662_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C83667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East|C84408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Total|BU_USEM_East_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20392_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20481_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20549_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31146_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20263_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20534_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20879_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20420_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80662_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C51396_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10007_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10031_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10110_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10516_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10517_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10768_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C11041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C11074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20020_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20046_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20063_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20076_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20077_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20131_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20148_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20221_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20239_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20306_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20319_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20324_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20342_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20451_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20494_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20549_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20609_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20619_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20624_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20685_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20700_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20882_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20888_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21154_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21839_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30105_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30106_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30107_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30216_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30228_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30346_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30542_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30837_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C31303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40015_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40028_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40075_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40177_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40179_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40181_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40186_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40187_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40197_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40206_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C40231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50189_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50493_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50508_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C50954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C60066_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C60068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70025_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70041_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C70158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80032_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C80094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C60167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20022_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20112_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20263_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20565_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C21817_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20205_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C10767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30232_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C30311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20045_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C20833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C60219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C81163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C81273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C81288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C81932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C81962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C82975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C83034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C83036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C83040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C83184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_East_Inactive|C83185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_Shared_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Shared_Total|BU_USEM_Shared|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Shared_Total|BU_USEM_Shared_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Shared_Inactive|C31078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_West_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Total|BU_USEM_West|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C10516_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C10570_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C20498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30057_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30542_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30847_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31008_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31032_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31038_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31098_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C70158_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C60233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C22339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C80013_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30749_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C52341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C11184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C31800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C20075_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C80709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30166_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C81216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C81363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C30102_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C81588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C10675_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C80045_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C82989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83672_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C83705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West|C84388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Total|BU_USEM_West_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C10318_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C11078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30357_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C31272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C31293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C60134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C60153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C80139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C80146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30356_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C31783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C22344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30797_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C20227_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C80727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30354_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30205_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30975_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C31040_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C20141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C21840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30246_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C31029_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C70219_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C10007_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C50040_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C10134_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C11183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C31792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C10692_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C60328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C80816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C21782_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81180_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30351_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C20908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30614_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C30796_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C11182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C60329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C80708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C81996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C82588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C82589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C82980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C82983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C83042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_West_Inactive|C83226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_Mid_Atlantic_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Mid_Atlantic_Total|BU_USEM_MidAtlantic|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C10719_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C20071_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C20241_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C20406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C20462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C21862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30030_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30275_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30342_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30758_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30762_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30893_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30902_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30985_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C31025_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C31066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C60136_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C11099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30217_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C60325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C31251_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C20451_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C80250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C80468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30244_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30241_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30696_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30709_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30887_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30763_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C30981_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C80473_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C20235_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C60066_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C80002_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C21924_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C51576_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81446_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C20306_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C81966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82718_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82742_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82753_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82754_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C82955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C83652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic|C84409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_Mid_Atlantic_Total|BU_USEM_MidAtlantic_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C11035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C20462_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C30779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C30810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C70013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C50033_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C80283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C81208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C30244_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C31802_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C51528_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C51622_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C82177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C82255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C11071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C30251_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C30343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C30758_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C40209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C60223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C31271_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C80469_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_MidAtlantic_Inactive|C81518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM|BU_USEM_GISOD_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD_Total|BU_USEM_GISOD_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD_Inactive|C50019_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD_Inactive|C10768_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD_Inactive|C30783_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD_Total|BU_USEM_GISOD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C80337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C20368_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C80472_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C10997_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C81540_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C83698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C83699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C83700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USEM_GISOD|C83701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USA|BU_CACI|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_CACI|C30544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CACI|C30544_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CACI|C30604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_USA|BU_EVP_USA_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_USA_Total|BU_EVP_USA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_USA|C11002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_USA_Total|BU_EVP_USA_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_USA_Inactive|C10007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_USA_Inactive|C30028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_USA_Inactive|C51074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_Nordics|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Nordics|BU_Sweden_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Total|BU_Sweden|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C21998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C22356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31503_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31662_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C31813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C40380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51439_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51495_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51662_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51753_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C51903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C60311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C70521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C80707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C80718_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C81362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C81419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C81420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C81451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C82540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden|C83570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Total|BU_Sweden_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C21942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C22188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C31669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C40379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51742_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51745_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51754_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51757_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51758_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51760_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C51905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C60310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C70650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Sweden_Inactive|C10578_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Nordics|BU_Finland_Estonia_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Total|BU_Finland_Estonia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|BU_Finland|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C21945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C22179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31495_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C31663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C40319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51672_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C51684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C70501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C80713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C80715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C80717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C80750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C80751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C81322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C81323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C81413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C81414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C81415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland|C82429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|BU_Estonia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C31567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C31585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C31624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C51449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C70307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C70308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C70319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C70434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Estonia|C81704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia|C83464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Total|BU_Finland_Estonia_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C22118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C40289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C80714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C80716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C80754_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C81319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C81320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C81321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C81324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C81325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C81326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Finland_Estonia_Inactive|C10842_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Nordics|BU_Norway_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Total|BU_Norway|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C22075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C22121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C31400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C31471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C31550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C31563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C31570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C40292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51446_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C70513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C80486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C51261_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81753_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81754_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81757_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81758_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81760_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C81900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C82485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C83465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway|C84216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Total|BU_Norway_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C31326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C31564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C51162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C51231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C51260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C51478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C51574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C51631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C70360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C70387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C80481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C80485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81540_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Norway_Inactive|C81791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Nordics|BU_Denmark_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Total|BU_Denmark|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70662_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C70669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C21969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C22337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31472_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31702_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31718_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31742_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31746_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31750_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31753_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31754_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31758_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C31782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C40404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C52008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C51547_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81660_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81662_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C81802_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C82529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C82826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C83573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C84304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C84390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark|C84391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Total|BU_Denmark_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70470_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C70668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22316_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C22332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31473_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31733_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31734_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31745_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31756_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31757_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31760_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31763_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31775_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31776_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31778_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31780_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C31781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C40405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C51996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C52010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C81702_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C81664_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C81665_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C81666_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C82530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C82531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Denmark_Inactive|C82532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Nordics|BU_GTO_Nordics|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Nordics|BU_EVP_Nordics|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_ECS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_Germany_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Total|BU_Germany|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C11013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C11075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C11080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C11083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C11084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C60157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C60158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C60166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70149_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C50915_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C21937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C21961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C21999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C22185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C31667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C40242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C40244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C51674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70471_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C70541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C80294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C80296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C80297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C80360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C80721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C81196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C81197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C81435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C81559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C81747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C82528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany|C83426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Total|BU_Germany_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10551_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10794_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20013_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20063_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20088_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20752_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21781_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C30636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C50729_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C50920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C60133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C60135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70118_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70159_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70159_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70197_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70199_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70219_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C40294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31331_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70496_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10032_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10317_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C11097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20138_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20627_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C20642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C50806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C60156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C60161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C60165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70074_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C21972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C22182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C40315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C51534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70469_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C70487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C10002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C31575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C80726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C81607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Germany_Inactive|C82825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_Netherlands_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Total|BU_Netherlands|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C50915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C31681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C40325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51688_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51690_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51693_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51697_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51702_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C51707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C70552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C22331_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81811_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C81839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82495_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82503_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C82496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands|C83374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Total|BU_Netherlands_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Inactive|C10106_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Inactive|C20762_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Inactive|C21868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Inactive|C70055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Inactive|C70116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Netherlands_Inactive|C81819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_Poland|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C10032_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C20637_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C20647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C20648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C20649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C20834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C20835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C20903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C21165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C21168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C21815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C21816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C21919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C21923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C22296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C22297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C31011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C31348_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C50836_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C50941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70040_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70167_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C70445_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C80752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C81337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C81387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C81529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Poland|C81703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_Belgium_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Total|BU_Belgium|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C21955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C21966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C21974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C22355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31672_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31697_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C31784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C40247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C40262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C50019_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C60237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C70672_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80703_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C51378_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80801_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80802_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80804_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C80805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81375_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C81878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C82557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83427_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C83675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C84301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C84302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium|C84303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Total|BU_Belgium_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C31695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C70346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C70353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C80783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C80784_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C80789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C80826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C80827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C82015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C82399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C21946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C21979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C22066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C22095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C31694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C51676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C70339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C70429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Belgium_Inactive|C81372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_Brazil|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C21952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C22116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C51447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C51599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C70462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C84314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Brazil|C84315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_Spain_Italy_Portugal_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Total|BU_Spain_Italy_Portugal|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C10032_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C10751_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C10808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C10818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C10854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C10894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C10951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C20247_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C20627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C20628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C20640_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C20826_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C20839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21783_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C22067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C22120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C22160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C22204_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C22347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C22350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C31157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C31569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C31692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C31785_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C50805_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51194_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51663_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C60095_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C60119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C60217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C60235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C60236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C60320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70074_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70119_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70159_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70188_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70197_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70240_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70446_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70457_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70528_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70568_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70584_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80488_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80753_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80782_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80792_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C80818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81275_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81314_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81371_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81688_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C81987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C82193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C82513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C21950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C51207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C70356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C83096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C83097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C83563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal|C84348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Total|BU_Spain_Italy_Portugal_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10708_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10790_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C11036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C11037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C11038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C11065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C11067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C11076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C20155_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C20630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C20632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21146_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C21997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22218_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C22295_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C31671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C40283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C40291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C40306_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C40307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C50805_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C50925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51320_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51398_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C51654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C60150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C60318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C60319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C60321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C60332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70074_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70074_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70085_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70085_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70085_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70085_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70176_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C70601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80735_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80736_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80741_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C81170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C81315_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C81370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C81454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C81615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C82195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C10318_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C80214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C83124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C83125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Spain_Italy_Portugal_Inactive|C83126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_CSEE_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_CSEE_Total|BU_CSEE|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C21990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C22014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C22074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C22098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C22117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C31429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C31525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C31528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C31533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C31566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C51345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C51406_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C51415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C51448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C51526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70495_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C70529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C80419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C81401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C81407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C81412_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C81910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C82286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C82287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C82288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C82289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83681_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83688_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83690_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83693_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83695_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C83697_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C84215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C84347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C84400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE|C84401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE_Total|BU_CSEE_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_CSEE_Inactive|C22045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_CSEE_Inactive|C40288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_South_America|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_South_America|BU_South_America_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_South_America_Non_PSA|BU_LATAM_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_Non_PSA|BU_LATAM_FC_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22266_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C31684_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C31685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C31688_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C31689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C31690_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C40326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C40327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C40328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C51710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C51720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C51725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C60176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C60206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C40385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C10248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C40409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C60340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C81256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C81257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C81258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C81259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C22238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C70588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FC_Non_PSA|C40384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_Non_PSA|BU_LATAM_FG_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C22234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C22236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C22245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C22246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C22257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C22282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C22289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C31691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C51718_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C51730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C70559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C70568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C70569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FG_Non_PSA|C70571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_Non_PSA|BU_LATAM_FH_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C51711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FH_Non_PSA|C70592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_Non_PSA|BU_LATAM_FO_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C22213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C22239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C22255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C22274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C22278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C22283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C31687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C40329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C51715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C60201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C70590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C70591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C40382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C40383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C81260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C81476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C81477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C81478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C81479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C81480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FO_Non_PSA|C81481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_Non_PSA|BU_LATAM_FP_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C80340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C80339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22226_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22264_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22265_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C31683_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C31686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C51729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60190_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60191_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C60209_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C70560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C70582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C70583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C70589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C70606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C70607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C22294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C81252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C81253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C81254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C81255_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C81464_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FP_Non_PSA|C81465_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_Non_PSA|BU_LATAM_FV_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C22287_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C31682_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C51712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C51713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C51723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C51724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C70556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C70566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C70586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_LATAM_FV_Non_PSA|C81261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_Shell|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_ECS|BU_EVP_ECS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_France|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Bus_Cons|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21936_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21959_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21960_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21973_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21980_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22000_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22002_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22004_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22041_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22046_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22047_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22054_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22065_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22076_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22123_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22124_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22125_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22147_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22163_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C22199_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31416_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31436_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31505_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31506_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31507_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31508_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31509_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31510_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31572_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31573_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31576_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31577_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31596_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51113_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51114_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51118_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51121_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51130_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51143_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51194_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51195_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51228_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51244_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51257_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51283_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51363_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51366_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51382_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51401_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51453_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51454_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51455_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51456_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51457_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51458_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51459_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51460_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51461_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51462_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51463_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51466_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51480_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51482_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51509_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51515_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51519_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51522_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51528_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51529_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51535_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51573_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51609_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51622_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51637_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51667_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51685_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70248_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70296_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70349_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70352_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70383_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70388_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70428_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70439_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70440_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70523_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70527_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31786_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51378_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C81409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70485_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C81949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C83236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C83237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C83238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C75029_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C75030_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C51465_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C70353_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C31575_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21926_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21930_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21932_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21933_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21963_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Bus_Cons|C21965_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Telecom|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C50715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C10448_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C21909_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C50879_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C50999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70119_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70122_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80053_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80054_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80061_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80102_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80133_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80239_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51457_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51466_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51637_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70296_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70349_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70352_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70383_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70388_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70428_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70439_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70440_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70523_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70527_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C10545_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C10652_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C20650_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C20652_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C20653_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C20709_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C20712_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C20734_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C20865_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C21123_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C21889_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C50033_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C50714_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51048_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51089_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70614_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80131_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C80719_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C81798_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C81799_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51114_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51458_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70528_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C70700_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51465_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C31573_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C21963_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Telecom|C51459_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Retail|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51378_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C22163_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21960_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C22002_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C22004_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C22046_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C22065_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C22123_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C22124_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C31436_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C31508_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C31573_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51130_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51143_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51194_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51195_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51283_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51382_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51455_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51456_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51457_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51458_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51460_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51462_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51480_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51535_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51573_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C70296_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C70428_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C31572_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C70440_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51118_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51228_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51244_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51366_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51453_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51454_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51482_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51515_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51519_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51522_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51528_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51529_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C51622_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C70530_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C31575_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21925_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21926_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21927_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21928_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21929_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21930_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21931_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21932_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21933_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21934_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21963_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Retail|C21965_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Transport|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31596_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51113_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51114_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51118_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51121_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51143_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51194_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51228_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51244_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51283_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51363_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51378_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51382_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51453_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51454_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51455_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51456_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51457_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51458_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51460_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51463_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51466_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51482_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51509_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51528_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51573_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51637_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51685_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70248_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70296_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70349_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70352_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70383_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70439_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70440_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70523_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70527_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C21960_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C21973_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C21980_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C22002_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C22046_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C22065_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C22076_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C22124_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C22163_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31436_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31505_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31506_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31507_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31508_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31509_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31510_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31572_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31573_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31576_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C81410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C81543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C80860_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C51622_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31577_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C83239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C70353_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Transport|C31560_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Finance_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Total|BU_France_Finance|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C21936_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C21959_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C21960_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C21973_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C21980_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22000_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22041_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22046_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22047_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22065_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22076_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22123_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22124_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22125_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22163_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22199_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C31416_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C31508_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C31572_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C31573_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C31576_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C31577_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51114_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51382_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51455_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51457_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51458_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51460_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51463_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51528_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51535_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C70352_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C70428_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C70439_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C70440_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C70523_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C70527_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C83249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C83250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C83291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C51462_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C21930_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance|C22002_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Total|BU_France_Finance_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C51637_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C51453_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C51515_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C51573_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C70296_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C70383_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C20653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C22054_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C22147_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C20650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C31506_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C51194_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C51456_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C31436_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C83248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C83251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C83289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Finance_Inactive|C83290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Grand_Ouest|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70439_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70440_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70527_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C21959_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C21960_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C21973_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C21980_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22000_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22002_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22004_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22041_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22046_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22065_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22076_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22124_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22125_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22163_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31436_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31505_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31506_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31508_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31510_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31573_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31576_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31577_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31596_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51244_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51363_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51382_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51401_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51453_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51454_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51455_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51456_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51457_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51458_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51459_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51460_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51462_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51463_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51466_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51482_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51522_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51528_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51529_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51535_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51573_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51622_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51637_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70296_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70352_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70428_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C22123_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51480_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51195_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31535_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51228_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83439_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C83443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C31572_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70700_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C70353_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C51430_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Ouest|C21931_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Grand_Est|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C10545_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C21959_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C21960_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C21973_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22002_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22004_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22041_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22046_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22065_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22076_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22123_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22124_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22125_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22163_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31416_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31436_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31506_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31510_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31572_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31573_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31576_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31577_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31596_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51113_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51121_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51130_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51194_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51195_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51244_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51366_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51401_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51453_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51454_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51455_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51456_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51457_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51458_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51459_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51460_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51462_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51463_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51466_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51480_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51482_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51509_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51519_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51522_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51535_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51573_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51637_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51667_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70296_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70352_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70383_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70428_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70439_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70440_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70523_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C70527_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C81795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C22000_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C20668_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C82263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C83240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C83241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C83242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C75030_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C51464_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31575_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31560_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C21928_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Grand_Est|C31508_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_ICE|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Nord|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C22163_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51194_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C70440_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C70296_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C21960_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C22002_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C22004_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C22046_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C22065_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C22123_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C31436_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C31508_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C31572_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C31573_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51130_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51143_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51283_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51378_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51382_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51455_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51456_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51457_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51458_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51460_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51535_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51573_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C70428_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C70439_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51460_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51456_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Nord|C51430_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_FGDC|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_FGDC|BU_FGDC|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_FGDC|C22076_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC|C10842_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC|C51121_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC|C70527_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_FGDC|BU_Morocco|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Morocco|C70380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Morocco|C70403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_FGDC|BU_FGDC_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C21958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C21965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C21981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C22003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C22023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C22162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C51383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C51436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C51532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C70238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C70284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C70378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C20063_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C80806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C80807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C80808_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C80809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C81572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C81573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C81574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C81575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C81882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_FGDC_Inactive|C81998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_France_Alcyane|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France|BU_EVP_France|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51195_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51283_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51401_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51460_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51685_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70296_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70439_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10448_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10646_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10652_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10696_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10749_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10756_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10759_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10773_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C11005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C11060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20063_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20063_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20088_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20088_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20652_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20708_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20734_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20743_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20744_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20747_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20752_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20755_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20759_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20774_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20865_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21010_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21035_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C30978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31786_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50019_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50033_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C60085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C60095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C60333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C60334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70352_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21936_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21959_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21960_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21973_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21980_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22000_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22002_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22004_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22041_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22046_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22047_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22054_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22065_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22076_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22123_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22124_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22125_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22147_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22163_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22199_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31416_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31436_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31505_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31506_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31507_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31508_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31509_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31510_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31572_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31573_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31576_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31577_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31596_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51113_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51114_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51118_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51121_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51130_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51143_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51194_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51195_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51228_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51244_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51257_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51283_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51363_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51366_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51378_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51382_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51401_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51453_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51454_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51455_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51456_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51457_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51458_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51459_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51460_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51461_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51462_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51463_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51466_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51480_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51482_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51509_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51515_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51519_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51522_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51528_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51529_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51535_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51573_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51609_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51622_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51637_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51667_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51685_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70248_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70296_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70349_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70352_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70383_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70388_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70428_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70439_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70440_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70523_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70527_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22004_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31505_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31507_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31509_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31510_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31596_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51113_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51118_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51121_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51130_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51143_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51195_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51228_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51244_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51257_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51283_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51363_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51366_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51378_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51401_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51454_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51459_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51461_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51466_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51480_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51482_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51509_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51519_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51522_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51529_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51609_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51622_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51667_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51685_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70248_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70349_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70388_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20650_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20652_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20653_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20709_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20712_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20734_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20865_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21123_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21889_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51048_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21936_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21959_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21960_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21973_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21980_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22000_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22002_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22004_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22041_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22046_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22047_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22054_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22065_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22076_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22123_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22124_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22125_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22147_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22163_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22199_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31416_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31436_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31505_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31506_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31507_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31508_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31509_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31510_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31572_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31573_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31576_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31577_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31596_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51113_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51114_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51118_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51121_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51130_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51143_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51194_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51195_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51228_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51244_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51257_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51283_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51363_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51366_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51378_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51382_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51401_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51453_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51454_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51455_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51456_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51457_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51458_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51459_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51460_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51461_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51462_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51463_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51466_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51480_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51482_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51509_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51515_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51519_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51522_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51528_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51529_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51535_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51573_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51609_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51622_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51637_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51667_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51685_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70248_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70296_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70349_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70352_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70383_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70388_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70428_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70439_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70440_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70523_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70527_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10652_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10929_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20088_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20650_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50714_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51089_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70120_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70614_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80055_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80056_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80131_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80740_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10448_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C20653_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21909_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50879_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51118_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51637_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70119_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70122_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80053_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80054_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80061_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80102_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80133_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C80239_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10545_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C50033_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C81885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21936_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21959_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21960_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21973_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C21980_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22000_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22002_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22004_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22041_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22046_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22047_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22054_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22065_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22076_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22123_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22124_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22125_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22147_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22163_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C22199_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31416_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31436_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31505_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31506_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31507_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31508_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31509_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31510_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31572_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31573_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31576_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31577_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C31596_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51113_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51114_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51118_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51121_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51130_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51143_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51194_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51195_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51228_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51244_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51257_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51283_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51363_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51366_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51378_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51382_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51401_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51453_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51454_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51455_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51456_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51457_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51458_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51459_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51460_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51461_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51462_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51463_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51466_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51480_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51482_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51509_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51515_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51519_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51522_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51528_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51529_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51535_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51573_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51609_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51622_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51637_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51667_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C51685_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70248_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70296_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70349_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70352_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70383_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70388_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70428_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70439_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70440_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70523_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C70527_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C81184_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C81185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C81229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C10842_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C81793_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C81950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|C81951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_France|BU_France_Manufacturing|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C50714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C50033_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C22124_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51114_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51118_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51130_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51228_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51244_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51257_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51366_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51401_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51453_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51454_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51457_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51458_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51482_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51515_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51519_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51522_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51528_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51529_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51535_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C51622_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_France_Manufacturing|C81544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_UK_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_Total|BU_United_Kingdom|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_UK_SDNS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C11093_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C11096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C31331_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C51558_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C80258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C80259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C80642_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C80657_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81065_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81066_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81069_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81072_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81073_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81074_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81075_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81076_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81077_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81078_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81083_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81095_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81111_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C81357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C82841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C84213_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C84214_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_SDNS|C84341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_UK_Energy_Utilities|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C11173_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80856_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80861_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80865_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80866_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80874_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80876_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80877_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80880_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80881_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80886_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80894_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80896_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80897_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C81151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C81152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C81999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82484_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C81193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83228_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83229_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83230_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83270_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C83422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80871_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80884_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C81508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C11166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70074_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70074_16|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70256_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80301_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C80883_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C82480_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C70613_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C51551_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C84221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C84298_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C84299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C84300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C84342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Energy_Utilities|C84343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_UK_Oil_Gas_Cons_Serv|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C11109_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C22090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51198_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51503_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C70512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C70526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80350_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80837_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80840_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80846_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80850_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81010_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82023_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C11147_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C11158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C11165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C50578_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51211_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51292_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C51562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C70241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80835_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C83089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C83161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C83273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C83423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C83424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20146_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C11155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20134_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20250_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20494_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20816_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20823_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20833_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20868_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21795_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21864_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C22293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C22301_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C22338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C70188_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80904_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80918_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80922_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C82541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C11151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C11153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20577_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C20872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C21893_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C80980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C81444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Oil_Gas_Cons_Serv|C84297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_UK_Banking_Fin_Market|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C10692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C11107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C11120_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C11154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C11164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C11176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20304_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20638_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C21014_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C21146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C21857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C51491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80640_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80844_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80905_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80929_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C81794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82018_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20138_20|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C20848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C70176_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80251_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80899_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80907_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80911_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80912_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80916_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80917_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80945_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80960_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80967_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80969_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80989_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C80999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C81001_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C81002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C81194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C83090_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C83162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C82765_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C83425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C83459_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C84344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Banking_Fin_Market|C84389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_UK_Cent_Gov_Justice|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C11113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C11121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C11127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C11142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C11145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31439_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C31654_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C40249_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C40278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C40279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C40313_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C50361_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80522_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80523_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C80583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81045_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C81860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C82436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C82437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C51201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C82769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C83227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C83267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C83560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Cent_Gov_Justice|C83561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_UK_Health_Local_Scot|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11106_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11122_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C11175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C31367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C31367_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40260_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40285_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40312_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C40323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80364_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80492_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80494_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80495_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80496_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80497_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80499_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80508_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80513_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80515_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80516_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80517_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80518_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80519_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80520_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80521_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80524_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80525_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80527_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80561_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80566_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80567_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80570_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80571_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80572_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80573_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80574_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80585_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80592_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80596_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80598_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80599_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80600_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80603_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80604_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80605_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80606_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80607_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80622_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80623_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80628_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80629_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80630_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80631_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81054_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81857_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C82444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C80329_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81057_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81059_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C81042_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C51643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C60326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C83046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C83088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C83377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C83378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C83379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C84345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Health_Local_Scot|C84346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_UK_Global_Tech_Ops|StoreData|Y|Y|N|N|||+|||||Unspecified|||||| BU_United_Kingdom|BU_EVP_UK|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C10448_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C11002_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C51615_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80325_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80328_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80329_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80433_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80796_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80797_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80815_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C81972_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C81973_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C11144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C11148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C11152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C20818_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C21857_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C22016_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C51197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C51241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C51333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C70118_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C70182_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80158_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80833_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80847_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80852_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80909_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80915_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80933_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80951_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C80981_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C81000_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C81041_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C81359_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C81957_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_UK|C81959_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Total|BU_UK_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31331_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81064_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81142_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40280_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80503_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80512_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80632_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81038_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81039_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81051_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81858_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80873_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80891_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C82478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51615_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80326_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80422_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80423_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80426_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80429_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80431_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80435_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80437_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80438_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80440_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20821_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20824_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22084_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51362_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80903_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80914_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80920_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80936_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80937_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80949_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80961_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80965_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80970_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80978_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80979_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81956_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10032_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10032_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10110_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10318_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10578_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10779_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10794_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C10986_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11011_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11011_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11011_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11110_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11114_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11115_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11126_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11129_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11132_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11140_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11146_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11150_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20024_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20071_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20077_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20077_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20118_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20135_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20138_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20185_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20304_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20633_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20633_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20633_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20634_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20637_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20638_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20657_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20714_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20812_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20812_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20814_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20821_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20822_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20824_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20826_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20827_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20829_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20848_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20853_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20853_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C20868_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21014_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21146_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21789_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21834_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21863_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21872_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21872_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21878_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21910_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21943_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21948_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21962_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21982_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21983_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21984_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21986_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C21996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22009_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22012_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22025_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22027_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22033_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22052_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22082_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22084_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22085_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22097_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22136_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22143_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22184_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22193_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C22197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30418_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30419_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30420_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30421_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30766_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30767_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30768_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30770_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30771_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30772_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C30931_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31021_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31332_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31380_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31417_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31428_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31430_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31437_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31446_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31455_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31457_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31490_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31493_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31498_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31543_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31544_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31556_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31557_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31591_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31591_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31611_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31645_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31646_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40261_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40284_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40310_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C50181_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C50189_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C50189_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C50578_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C50707_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C50787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C50788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51166_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51167_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51188_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51189_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51379_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51615_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C51638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C60314_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70041_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70055_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70060_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70074_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70074_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70074_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70074_15|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70118_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70125_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70150_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70159_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70165_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70217_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70474_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C70613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80147_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80156_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80159_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80160_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80161_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80162_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80163_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80164_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80165_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80166_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80169_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80170_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80183_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80202_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80208_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80208_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80248_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80289_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80319_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80319_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80319_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80325_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80326_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80328_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80329_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80344_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80383_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80422_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80423_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80426_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80429_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80430_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80431_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80435_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80436_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80437_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80438_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80439_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80440_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80442_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80444_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80444_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80446_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80551_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80587_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80614_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80619_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80621_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80626_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80627_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80633_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80636_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80637_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80657_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80658_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80659_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80700_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80701_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80748_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80769_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80836_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80845_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80849_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80851_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80901_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80908_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80919_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80923_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80924_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80938_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80939_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80941_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80946_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80963_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80976_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80985_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80987_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80988_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80996_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80997_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81003_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81008_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81028_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81030_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81031_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81035_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81043_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81062_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81063_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81068_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81079_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81199_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81231_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81308_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81308_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81569_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80942_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C82764_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C11149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C31338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C40281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80531_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80541_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80593_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80616_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81009_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81036_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81036_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81040_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C82431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C82438_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C82439_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C82440_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81047_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C81037_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C83108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_UK_Inactive|C80870_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_Asia_Pacific|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Asia_Pacific|BU_India_total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_total|BU_India_CME|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_CME|C70533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_total|BU_India_BFSI|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_BFSI|C20868_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_total|BU_India_MRD|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_MRD|C51272_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_MRD|C51584_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_MRD|C51670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_MRD|C51671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_MRD|C81207_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_total|BU_India_Solutions|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C10032_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81668_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C20077_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C20650_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C22137_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C21902_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C22005_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C22207_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C22346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C31787_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81673_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81667_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81674_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81974_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81672_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81679_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81676_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C81677_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C82542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Solutions|C82543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_total|BU_India_GIS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_total|BU_India_SUPT|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_total|BU_India_Admin|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C31788_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C10017_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C20020_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C20071_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C20870_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C21940_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C21975_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22108_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22138_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22139_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22141_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22196_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C51584_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C51670_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C80157_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C80251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C80252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C21799_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C80739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C20138_18|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C22331_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C80907_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81669_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81796_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81668_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81671_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81673_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81677_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81667_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81670_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81672_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81674_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_India_Admin|C81676_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Asia_Pacific|BU_South_East_Asia_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Total|BU_South_East_Asia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C22119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C31568_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C51443_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C51450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C51539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81263_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C81353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia|C31493_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Total|BU_South_East_Asia_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C22087_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C40290_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C40324_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C51153_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C51342_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C51346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C51538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C70435_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C81234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_South_East_Asia_Inactive|C81405_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Asia_Pacific|BU_Middle_East_Asia_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Total|BU_Middle_East_Asia_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C21968_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C22099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C22100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C22101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C22134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C22177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C31536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C31537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C31590_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C31613_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C31615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C31642_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C11117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C70234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C70318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C70372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA|C70491_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Total|BU_Middle_East_Asia_Non_PSA_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA_Inactive|C31411_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA_Inactive|C70235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA_Inactive|C70269_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA_Inactive|C70534_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Middle_East_Asia_Non_PSA_Inactive|C22194_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Asia_Pacific|BU_Australia_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Total|BU_Australia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70074_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70251_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70252_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70253_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70279_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70281_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70321_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70343_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70381_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70399_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70400_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70454_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70458_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70461_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70477_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70489_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70514_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70537_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C80705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C10885_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C11181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C20655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C20669_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C20714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C20724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C21995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C30875_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31372_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31384_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31390_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31396_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31546_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31555_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31588_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31597_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31601_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31661_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31665_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C31666_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51205_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51307_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51413_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51441_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C52334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C52335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C52337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C52339_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C52340_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C60221_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C60327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C60335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C60337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C60341_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C70035_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81235_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81509_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81714_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81717_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81718_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81720_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81721_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81722_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81723_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81724_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81725_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81726_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81729_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81732_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81854_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81925_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C81955_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82005_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82006_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82351_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82352_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82358_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82359_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82365_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82366_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82367_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82408_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82451_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82559_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82827_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82828_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82832_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82990_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82991_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82992_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82993_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C82994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83049_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C51675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C52336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83102_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83103_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83127_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83128_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83177_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83178_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83179_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83244_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83245_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83246_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83247_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83468_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83607_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83608_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83609_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C83687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84217_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84218_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia|C84395_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Total|BU_Australia_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70331_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70392_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70448_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70502_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70504_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70506_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70510_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70536_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70538_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80276_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80377_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80467_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80650_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80829_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80830_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20072_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20138_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20138_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20716_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C21926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C22017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C22093_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30817_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30867_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31334_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31335_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31382_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31389_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31393_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31463_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31553_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31580_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31699_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C50899_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51129_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51204_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51288_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51475_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51564_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60168_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81236_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81926_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81928_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C82354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C82410_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70085_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70159_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70262_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70330_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70369_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70409_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70426_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80376_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80425_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80449_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80647_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10007_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10539_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10579_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10806_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10887_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10908_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10944_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C11046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C11094_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C11180_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20138_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20367_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20486_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20626_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C21034_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C21834_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C22192_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30595_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30774_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30791_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30831_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30853_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30875_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30875_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30932_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30953_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C30971_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31268_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31277_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31302_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31304_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31356_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31385_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31391_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31482_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31644_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C31698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C50913_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51129_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C51511_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60149_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60222_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60336_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81855_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C70594_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C80478_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C10825_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C11053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20138_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C20715_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C21013_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C52333_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C52338_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C60155_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81239_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81719_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81728_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C81954_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C82361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C82369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C82370_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C82995_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C83100_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C83104_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C83105_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Australia_Inactive|C83346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Asia_Pacific|BU_EVP_Asia_Pacific_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_Asia_Pacific_Total|BU_EVP_Asia_Pacific_Inactive|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_EVP_Asia_Pacific_Inactive|C20706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_EVP_Asia_Pacific_Inactive|C11002_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_Corporate|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Corporate|BU_Corp|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Corp|BU_Corp_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C10032_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C10711_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C10819_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C10880_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C10890_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C10958_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C11026_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C20714_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C30176_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C30398_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C40195_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C70003_22|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C70219_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80291_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80326_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80329_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C20349_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80641_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80693_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80694_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80690_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80691_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C30369_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80689_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80710_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80711_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C80712_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C11129_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C81199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C81220_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C81077_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C81540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp_PSA|C81980_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corp|BU_Corp_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Corporate|BU_Corporate_Adj|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_Corporate_Adj|C10709_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corporate_Adj|C20727_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corporate_Adj|C20737_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corporate_Adj|C20738_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corporate_Adj|C20739_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_Corporate_Adj|C70003_15|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Client_by_BU|BU_None|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C19999_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C29999_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_15|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_16|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_17|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_18|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_19|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_20|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_21|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_22|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_23|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_24|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_25|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_26|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_27|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_28|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_29|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_30|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_31|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_32|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_33|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C39999_34|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C49999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C49999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C49999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C49999_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C49999_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C49999_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C59999_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C69999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C69999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C79999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C79999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C89999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C89999_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C89999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C99998_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| BU_None|C99999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| #root|Client_by_Top_Backlog|NeverShare|Y|Y|N|N|||~|||||Unspecified|||||| Client_by_Top_Backlog|Top_Backlog_Parents|NeverShare|Y|Y|N|N|||~|||||Unspecified||||Top Backlog Parents|| Top_Backlog_Parents|TBL_Bell|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70003_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70002_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70048_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70003_21|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70006_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70004_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70003_19|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Bell|C70022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Client_by_Top_Backlog|Top_Backlog_Region|NeverShare|Y|Y|N|N|||~|||||Unspecified|||||| Top_Backlog_Region|TBL_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_Atlantic_SCU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C20353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C80058_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C21171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C80761_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C20325_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C30602_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C80643_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C81879_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C20542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Atlantic_SCU|C20547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_GM_CPS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C83134_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C10518_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C50554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C30337_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C80022_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C50025_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C10921_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C30659_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C10106_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GM_CPS|C81686_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_GMA_FIN|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20076_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20257_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C59999_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20101_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20257_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20349_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20650_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C59999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20852_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GMA_FIN|C20892_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_GTO|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C19999_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C20475_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C10397_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C81683_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C69999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C10382_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C82267_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C82842_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C70003_24|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTO|C82363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_GTA_CPS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|CP_Bell|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Bell Total|| TBL_GTA_CPS|C83130_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C20730_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C20250_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C31173_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C20368_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C60102_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C20494_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C31254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_CPS|C60121_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_GTA_BKS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20073_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20135_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20507_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20481_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20011_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C20273_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C83148_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_GTA_BKS|C21044_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_NCR|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C21017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C80656_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C20106_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C80651_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C30238_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C30777_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C83133_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C30145_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C30259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_NCR|C30056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_Quebec|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C20317_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C30843_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C30050_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C30192_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C20076_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C30271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C80639_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C30172_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C10311_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Quebec|C21841_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Canada|TBL_West_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C50486_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C20225_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C30019_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C30586_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C50900_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C30575_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C83053_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C50337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C50234_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_West_Canada|C80099_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Top_Backlog_Region|TBL_USA|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_IDAC|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C30546_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C31240_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C30565_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C30546_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C30830_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C30830_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C31242_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C84223_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C31243_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_IDAC|C31241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_RAP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C30055_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C30547_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C30547_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C30562_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C30547_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C31017_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C83012_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C30545_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C21930_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_RAP|C31017_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_DEF_GSS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31199_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31203_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31206_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31092_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31086_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31216_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31797_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31222_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_DEF_GSS|C31091_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_HCP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30550_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30783_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C31117_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30838_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C31112_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30403_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30783_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30404_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30402_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_HCP|C30783_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_SAJE|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30580_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30097_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30618_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30554_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C31222_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30583_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30093_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30820_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C31311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_SAJE|C30548_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_USEM_ISBU|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C21985_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C81466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C20714_05|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C21030_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C22097_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C21982_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C81154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C20071_08|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C20804_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_ISBU|C31682_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_USEM_New_England|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C30165_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C20898_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C20357_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C84227_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C50581_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C82624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C83487_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C83582_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C83542_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_New_England|C83479_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_USEM_Central|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C20183_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C80456_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C50578_06|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C30576_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C20601_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C82809_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C20337_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C83182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C30612_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_Central|C82241_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_USEM_South|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C70001_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C30010_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C50415_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C30345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C20869_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C81388_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C82706_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C80215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C82638_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_South|C20619_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_USEM_MidAtlantic|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C21862_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C20462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C30244_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C30342_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C30610_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C30217_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C81289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C81187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C30985_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_MidAtlantic|C81181_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_USEM_East|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C20868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C20185_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C30108_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C21783_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C30807_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C60152_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C20535_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C22300_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C20151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_East|C30224_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USA|TBL_USEM_West|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C30353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C30847_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C82414_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C31029_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C83123_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C83670_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C82577_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C31294_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C30731_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_USEM_West|C31309_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Top_Backlog_Region|TBL_Nordics|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Nordics|TBL_Denmark|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C40305_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C31617_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C31422_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C22007_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C31655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C81620_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C40299_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C31548_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C52182_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Denmark|C81625_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Nordics|TBL_Finland_Estonia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C80713_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C22109_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C82429_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C31540_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C40257_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C70501_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C22171_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C31363_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C81323_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Finland_Estonia|C51328_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Nordics|TBL_Norway|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C31563_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C51588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C51261_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C51354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C82186_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C83386_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C82485_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C51589_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C70397_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Norway|C70416_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Nordics|TBL_Sweden|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C31648_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C31424_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C60303_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C21935_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C51318_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C70500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C70259_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C51549_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C22157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Sweden|C22187_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Top_Backlog_Region|TBL_ECS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_Belgium|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C70311_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C81373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C70293_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C22070_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C70250_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C22354_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C70374_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C70653_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C70258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Belgium|C80803_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_CSEE|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C70431_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C51526_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C83680_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C22098_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C70452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C51345_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C81407_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C83462_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C82286_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_CSEE|C70282_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_Germany|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C81197_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C22015_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C51131_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C82528_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C51174_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C51664_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C51232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C70530_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C31355_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Germany|C80297_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_Netherlands|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C70543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C82500_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C81810_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C51707_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C81800_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C51704_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C51692_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C22200_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C51698_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Netherlands|C51687_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_Poland|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C81387_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C20637_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C20649_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C21815_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C70118_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C29999_14|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C80284_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C20834_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C81529_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Poland|C80394_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_Spain_Italy_Portugal|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C80813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C21977_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C80483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C20839_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C21950_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C51489_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C21964_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C70322_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C81369_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Spain_Italy_Portugal|C83096_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_Brazil|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C70415_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C70327_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C51447_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C99999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C70432_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C22116_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C70357_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C70278_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C69999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Brazil|C21952_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_ECS|TBL_South_America|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C60175_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C22212_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C81476_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C22232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C22258_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C70588_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C22215_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C22210_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C22237_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_America|C22233_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Top_Backlog_Region|TBL_France|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Bus_Cons|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C51465_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C70296_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C70352_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C51573_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C31506_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C22163_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C70428_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C31573_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C21960_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Bus_Cons|C83238_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Finance|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C22163_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C31416_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C21936_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C21973_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C22002_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C22046_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C21960_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C21959_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C22065_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Finance|C22076_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Grand_Est|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C70296_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C51464_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C51194_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C51401_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C51458_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C51535_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C51121_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C70428_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C31560_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Est|C22002_11|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Grand_Ouest|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C51244_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C22076_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C70353_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C31506_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C70428_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C22163_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C22002_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C70296_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C22000_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Grand_Ouest|C31505_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Nord|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C51430_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C51143_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C51460_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C22065_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C51458_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C21960_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C31508_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C99999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C31573_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Nord|C22004_13|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Retail|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C51382_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C51528_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C21929_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C51378_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C51622_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C21928_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C51515_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C21931_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C21965_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Retail|C51194_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Telecom|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C51637_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C80239_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C51465_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C70296_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C70352_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C51114_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C70428_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C70527_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C70523_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Telecom|C70700_10|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France|TBL_France_Transport|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C31573_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C31505_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C31596_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C31506_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C31436_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C31510_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C51573_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C31507_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C51509_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_France_Transport|C51363_09|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Top_Backlog_Region|TBL_United_Kingdom|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_United_Kingdom|TBL_UK_Commercial|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C81020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C80838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C81024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C81056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C80329_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C20638_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C80934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C81361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C80906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Commercial|C81061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_United_Kingdom|TBL_UK_Energy_Utilities|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C81151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C80868_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C80289_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C82483_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C80859_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C80895_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C80882_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C80889_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C80888_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Energy_Utilities|C70532_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_United_Kingdom|TBL_UK_Bank_FM|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C80934_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C20638_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C80927_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C20848_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C11154_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C11176_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C20635_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C20813_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C80947_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Bank_FM|C11107_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_United_Kingdom|TBL_UK_Cent_Gov_Justice|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C31543_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C31373_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C31452_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C31552_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C31348_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C81360_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C81860_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C83560_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C81046_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Cent_Gov_Justice|C51201_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_United_Kingdom|TBL_UK_Oil_Gas_Cons_Serv|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C81020_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C81024_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C80838_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C51615_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C80906_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C51624_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C21151_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C20868_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C80966_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Oil_Gas_Cons_Serv|C51271_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_United_Kingdom|TBL_UK_Health_Local_Scot|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C82434_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C83088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C11157_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C80329_03|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C81056_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C83378_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C81361_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C82347_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C81705_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_Health_Local_Scot|C81061_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_United_Kingdom|TBL_UK_SDNS|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81124_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C99999_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81144_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81067_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81080_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81113_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81088_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81081_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81089_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_UK_SDNS|C81071_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| Top_Backlog_Region|TBL_Asia_Pacific|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Asia_Pacific|TBL_Australia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C82994_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C83050_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C70453_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C83466_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C70035_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C82558_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C70254_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C70274_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C20655_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Australia|C70505_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Asia_Pacific|TBL_India|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_India|C51671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C70533_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C81678_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C81675_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C20868_04|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C20077_07|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C10032_12|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C22207_02|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C81671_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_India|C22346_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_Asia_Pacific|TBL_South_East_Asia|NeverShare|Y|Y|N|N|||+|||||Unspecified|||||| TBL_South_East_Asia|C81232_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_East_Asia|C51450_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_East_Asia|C81353_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_East_Asia|C81231_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_East_Asia|C22119_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| TBL_South_East_Asia|C81317_01|ShareData|N|Y|N|N|||+|||||Unspecified|||||| #root|Tiers|NeverShare|Y|Y|N|N|||~|||||Unspecified|||||| Tiers|Consulting|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Consulting - Consulting|| Tiers|Systems_Int|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Systems_Int - Systems Integration|| Tiers|Outsourcing_IT|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Outsourcing_IT - IT Outsourcing|| Outsourcing_IT|Tier1|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Tier1 - Tier 1|| Outsourcing_IT|Tier2|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Tier2 - Tier 2|| Outsourcing_IT|Tier3|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Tier3 - Tier 3|| Outsourcing_IT|Tier4|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Tier4 - Tier 4|| #root|IP_Solutions|NeverShare|Y|Y|N|N|||~|||||Unspecified||||IP Solutions|| IP_Solutions|IP_Solutions_Commercial|NeverShare|Y|Y|N|N|||+|||||Unspecified||||IP Solutions - Commercial|| IP_Solutions_Commercial|Australia_AP001|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Australia_AP001 - Mosaic|| IP_Solutions_Commercial|GTA_BKS_CA004|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_BKS_CA004 - FXSuite360|| IP_Solutions_Commercial|Atlantic_SCU_CA005|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Atlantic_SCU_CA005 - HWG RFS|| IP_Solutions_Commercial|NCR_CA006|NeverShare|Y|Y|N|N|||+|||||Unspecified||||NCR_CA006 - HWG Case Management|| IP_Solutions_Commercial|GTA_BKS_CA007|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_BKS_CA007 - Wealth360 Investment Funds|| IP_Solutions_Commercial|GTA_BKS_CA008|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_BKS_CA008 - Wealth360 Plan Administration|| IP_Solutions_Commercial|GTA_BKS_CA009|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_BKS_CA009 - Wealth360 Portfolio Management|| IP_Solutions_Commercial|GTA_BKS_CA010|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_BKS_CA010 - Wealth360 Securities Processing|| IP_Solutions_Commercial|Atlantic_SCU_CA018|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Atlantic_SCU_CA018 - Horizon Financial Suite|| IP_Solutions_Commercial|GTA_CPS_CA020|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA020 - IIS (Insurance Information Services)|| IP_Solutions_Commercial|West_Canada_CA023|NeverShare|Y|Y|N|N|||+|||||Unspecified||||West_Canada_CA023 - LAND|| IP_Solutions_Commercial|GM_CPS_CA029|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GM_CPS_CA029 - Njoyn|| IP_Solutions_Commercial|GM_CPS_CA034|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GM_CPS_CA034 - PragmaCAD|| IP_Solutions_Commercial|GM_CPS_CA036|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GM_CPS_CA036 - PragmaLINE|| IP_Solutions_Commercial|West_Canada_CA040|NeverShare|Y|Y|N|N|||+|||||Unspecified||||West_Canada_CA040 - HCA|| IP_Solutions_Commercial|West_Canada_CA041|NeverShare|Y|Y|N|N|||+|||||Unspecified||||West_Canada_CA041 - MDC|| IP_Solutions_Commercial|GTA_CPS_CA042|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA042 - Real Time Transaction Manager (RTM)|| IP_Solutions_Commercial|West_Canada_CA044|NeverShare|Y|Y|N|N|||+|||||Unspecified||||West_Canada_CA044 - Royalty Management System|| IP_Solutions_Commercial|West_Canada_CA047|NeverShare|Y|Y|N|N|||+|||||Unspecified||||West_Canada_CA047 - X2R|| IP_Solutions_Commercial|France_Transport_FR018|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Transport_FR018 - Grand Angle|| IP_Solutions_Commercial|Sweden_NR004|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR004 - Business for Utilities Units|| IP_Solutions_Commercial|Denmark_NR005|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Denmark_NR005 - CommunityCare360|| IP_Solutions_Commercial|Sweden_NR009|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR009 - EKO|| IP_Solutions_Commercial|Denmark_NR012|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Denmark_NR012 - FlexProperty|| IP_Solutions_Commercial|Sweden_NR013|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR013 - Heroma|| IP_Solutions_Commercial|Finland_Estonia_NR014|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR014 - HRM|| IP_Solutions_Commercial|Norway_NR017|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Norway_NR017 - IS Suite|| IP_Solutions_Commercial|Finland_Estonia_NR018|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR018 - Kolibri|| IP_Solutions_Commercial|Finland_Estonia_NR020|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR020 - Merlot|| IP_Solutions_Commercial|Finland_Estonia_NR023|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR023 - Navici Suite|| IP_Solutions_Commercial|Sweden_NR024|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR024 - Palasso|| IP_Solutions_Commercial|Sweden_NR027|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR027 - Pharma Logica|| IP_Solutions_Commercial|Sweden_NR028|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR028 - POL Personalsystem|| IP_Solutions_Commercial|Denmark_NR029|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Denmark_NR029 - PROCOS|| IP_Solutions_Commercial|Sweden_NR030|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR030 - Raindance|| IP_Solutions_Commercial|Finland_Estonia_NR032|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR032 - Rondo|| IP_Solutions_Commercial|Finland_Estonia_NR033|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR033 - SME Products Finland (Mtc)|| IP_Solutions_Commercial|Finland_Estonia_NR035|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR035 - HWG Profio360|| IP_Solutions_Commercial|Finland_Estonia_NR036|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR036 - Sonet|| IP_Solutions_Commercial|Sweden_NR037|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR037 - Treserva|| IP_Solutions_Commercial|Sweden_NR038|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR038 - TWIN|| IP_Solutions_Commercial|Norway_NR039|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Norway_NR039 - WinTid|| IP_Solutions_Commercial|Norway_NR040|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Norway_NR040 - WM-Card|| IP_Solutions_Commercial|Finland_Estonia_NR041|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR041 - Aromi|| IP_Solutions_Commercial|Finland_Estonia_NR042|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR042 - Powered Gemini|| IP_Solutions_Commercial|Spain_Italy_Portugal_SE001|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Spain_Italy_Portugal_SE001 - GO|| IP_Solutions_Commercial|Spain_Italy_Portugal_SE002|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Spain_Italy_Portugal_SE002 - Renewable Management System (RMS)|| IP_Solutions_Commercial|Spain_Italy_Portugal_SE003|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Spain_Italy_Portugal_SE003 - Sm@rtering|| IP_Solutions_Commercial|Spain_Italy_Portugal_SE004|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Spain_Italy_Portugal_SE004 - Utilities Business Suite (UBS)|| IP_Solutions_Commercial|UK_HEALTH_LOCAL_SCOT_UK006|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_HEALTH_LOCAL_SCOT_UK006 - e-Carelogic|| IP_Solutions_Commercial|UK_HEALTH_LOCAL_SCOT_UK007|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_HEALTH_LOCAL_SCOT_UK007 - ePayfact|| IP_Solutions_Commercial|UK_OIL_GAS_CONS_SERV_UK008|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_OIL_GAS_CONS_SERV_UK008 - GIOS|| IP_Solutions_Commercial|UK_Energy_Utilities_UK009|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Energy_Utilities_UK009 - Instant Energy|| IP_Solutions_Commercial|USEM_ISBU_US001|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US001 - ACLS|| IP_Solutions_Commercial|USEM_ISBU_US002|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US002 - Advantage Collections (CACS-G)|| IP_Solutions_Commercial|USEM_ISBU_US003|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US003 - ARM Suite|| IP_Solutions_Commercial|USEM_ISBU_US004|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US004 - Advantage|| IP_Solutions_Commercial|USEM_ISBU_US005|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US005 - EDGE|| IP_Solutions_Commercial|USEM_ISBU_US006|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US006 - Collections360|| IP_Solutions_Commercial|USEM_ISBU_US008|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US008 - Originations360|| IP_Solutions_Commercial|USEM_ISBU_US009|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US009 - Payments360 BESS|| IP_Solutions_Commercial|USEM_ISBU_US010|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US010 - Payments360 Hotscan|| IP_Solutions_Commercial|USEM_ISBU_US012|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US012 - Payments360 All Payments|| IP_Solutions_Commercial|USEM_ISBU_US013|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US013 - Payments360 LCM|| IP_Solutions_Commercial|USEM_ISBU_US014|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US014 - Payments360 LCSS|| IP_Solutions_Commercial|USEM_ISBU_US015|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US015 - Payments360 Messageway|| IP_Solutions_Commercial|USEM_ISBU_US016|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US016 - Pragma Efficiency|| IP_Solutions_Commercial|USEM_ISBU_US017|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US017 - ProSteward|| IP_Solutions_Commercial|USEM_ISBU_US018|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US018 - Ratabase|| IP_Solutions_Commercial|USEM_ISBU_US019|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US019 - Sovera|| IP_Solutions_Commercial|USEM_ISBU_US021|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US021 - TEMPO|| IP_Solutions_Commercial|USEM_ISBU_US022|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US022 - Trade360|| IP_Solutions_Commercial|USEM_EAST_US023|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_EAST_US023 - ARTS|| IP_Solutions_Commercial|HCP_US025|NeverShare|Y|Y|N|N|||+|||||Unspecified||||HCP_US025 - HWG ProperPay|| IP_Solutions_Commercial|HCP_US026|NeverShare|Y|Y|N|N|||+|||||Unspecified||||HCP_US026 - HWG OnCue360|| IP_Solutions_Commercial|FGM_US027|NeverShare|Y|Y|N|N|||+|||||Unspecified||||FGM_US027 - Eligo PASS|| IP_Solutions_Commercial|USEM_CENTRAL_US029|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_CENTRAL_US029 - FAS|| IP_Solutions_Commercial|USEM_EAST_US031|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_EAST_US031 - ICAPS|| IP_Solutions_Commercial|USEM_EAST_US033|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_EAST_US033 - Mass Auto|| IP_Solutions_Commercial|FGM_US035|NeverShare|Y|Y|N|N|||+|||||Unspecified||||FGM_US035 - Momentum|| IP_Solutions_Commercial|USEM_CENTRAL_US036|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_CENTRAL_US036 - PetroComp|| IP_Solutions_Commercial|USEM_SOUTH_US038|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_SOUTH_US038 - Tapestry|| IP_Solutions_Commercial|FGM_US040|NeverShare|Y|Y|N|N|||+|||||Unspecified||||FGM_US040 - Unify360|| IP_Solutions_Commercial|HCP_US046|NeverShare|Y|Y|N|N|||+|||||Unspecified||||HCP_US046 - CATS|| IP_Solutions_Commercial|GMA_FIN_CA019|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GMA_FIN_CA019 - HR Payroll|| IP_Solutions_Commercial|Netherlands_CE002|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE002 - Central Market System|| IP_Solutions_Commercial|Finland_Estonia_NR031|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR031 - HWG Travex360|| IP_Solutions|IP_Solutions_Digital_Enablers|NeverShare|Y|Y|N|N|||+|||||Unspecified||||IP Solutions - Digital Enablers|| IP_Solutions_Digital_Enablers|Australia_AP002|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Australia_AP002 - RTU|| IP_Solutions_Digital_Enablers|Australia_AP003|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Australia_AP003 - CIS/OV|| IP_Solutions_Digital_Enablers|Australia_AP004|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Australia_AP004 - Nempower (Trading )|| IP_Solutions_Digital_Enablers|Australia_AP005|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Australia_AP005 - Nemstart (Metering)|| IP_Solutions_Digital_Enablers|GTA_CPS_CA001|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA001 - Abridged External Rating System (AERS)|| IP_Solutions_Digital_Enablers|NCR_CA013|NeverShare|Y|Y|N|N|||+|||||Unspecified||||NCR_CA013 - DynaDocs|| IP_Solutions_Digital_Enablers|GTA_CPS_CA030|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA030 - Operator Call Analysis System (OCAS)|| IP_Solutions_Digital_Enablers|West_Canada_CA031|NeverShare|Y|Y|N|N|||+|||||Unspecified||||West_Canada_CA031 - Partner Data Exchange (PDE)|| IP_Solutions_Digital_Enablers|GTA_CPS_CA043|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA043 - Reference|| IP_Solutions_Digital_Enablers|Atlantic_SCU_CA045|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Atlantic_SCU_CA045 - Single Window Govt|| IP_Solutions_Digital_Enablers|GTA_CPS_CA046|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA046 - WorkPro|| IP_Solutions_Digital_Enablers|Atlantic_SCU_CA048|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Atlantic_SCU_CA048 - Liberty|| IP_Solutions_Digital_Enablers|GTA_CPS_CA049|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA049 - External Rater|| IP_Solutions_Digital_Enablers|GTA_CPS_CA050|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTA_CPS_CA050 - TCDS|| IP_Solutions_Digital_Enablers|GM_CPS_CA051|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GM_CPS_CA051 - My Health Portal|| IP_Solutions_Digital_Enablers|Quebec_CA052|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Quebec_CA052 - HWG Migration Director|| IP_Solutions_Digital_Enablers|Quebec_CA053|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Quebec_CA053 - Harmonie|| IP_Solutions_Digital_Enablers|Quebec_CA054|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Quebec_CA054 - SEAO|| IP_Solutions_Digital_Enablers|GTO_T1_DMS_CA055|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GTO_T1_DMS_CA055 - Hybrid IT360|| IP_Solutions_Digital_Enablers|Atlantic_SCU_CA056|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Atlantic_SCU_CA056 - CityHall360|| IP_Solutions_Digital_Enablers|Netherlands_CE001|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE001 - SPADE|| IP_Solutions_Digital_Enablers|Netherlands_CE003|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE003 - CIMS Charge Point Interactive Management System|| IP_Solutions_Digital_Enablers|Netherlands_CE004|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE004 - Data2Diamonds|| IP_Solutions_Digital_Enablers|Netherlands_CE005|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE005 - Enterprise Mobility|| IP_Solutions_Digital_Enablers|Netherlands_CE006|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE006 - IBOR|| IP_Solutions_Digital_Enablers|Netherlands_CE007|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE007 - Identity and Access Management (IAM)|| IP_Solutions_Digital_Enablers|Netherlands_CE008|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE008 - Internet of Things Platform (NL)|| IP_Solutions_Digital_Enablers|Netherlands_CE009|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE009 - IT Asset Management|| IP_Solutions_Digital_Enablers|Netherlands_CE010|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE010 - Legacy Modernization|| IP_Solutions_Digital_Enablers|Netherlands_CE011|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE011 - Managed Cybersecurity|| IP_Solutions_Digital_Enablers|Netherlands_CE012|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE012 - Mission Critical Application Hosting|| IP_Solutions_Digital_Enablers|Netherlands_CE013|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE013 - Next Generation Operational Intelligence|| IP_Solutions_Digital_Enablers|Germany_CE014|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE014 - Customer360 for Media|| IP_Solutions_Digital_Enablers|Germany_CE015|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE015 - Project Management aaS (PMaaS)|| IP_Solutions_Digital_Enablers|Germany_CE016|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE016 - eCommerce Full Service|| IP_Solutions_Digital_Enablers|Germany_CE017|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE017 - BICEPS|| IP_Solutions_Digital_Enablers|Germany_CE018|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE018 - Document Handling System (DHS)|| IP_Solutions_Digital_Enablers|Germany_CE019|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE019 - IT Modernisation 360|| IP_Solutions_Digital_Enablers|Germany_CE020|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE020 - Real Mobile Test Cloud|| IP_Solutions_Digital_Enablers|Germany_CE021|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE021 - Testdata as a Service|| IP_Solutions_Digital_Enablers|Germany_CE022|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE022 - Landscape Migration Tool LMT|| IP_Solutions_Digital_Enablers|Germany_CE023|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE023 - IoT SaaS Platform|| IP_Solutions_Digital_Enablers|Germany_CE024|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE024 - FirstSpirit 2 JBoss Adapter|| IP_Solutions_Digital_Enablers|Germany_CE028|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE028 - Secure Web Surfing|| IP_Solutions_Digital_Enablers|Netherlands_CE029|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE029 - Manufacturing Atlas|| IP_Solutions_Digital_Enablers|CSEE_CE030|NeverShare|Y|Y|N|N|||+|||||Unspecified||||CSEE_CE030 - HWG Centaur|| IP_Solutions_Digital_Enablers|France_Grand_Ouest_FR001|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Grand_Ouest_FR001 - HWG Mobility Platform|| IP_Solutions_Digital_Enablers|France_GRAND_OUEST_FR002|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_GRAND_OUEST_FR002 - D-Box|| IP_Solutions_Digital_Enablers|France_NORD_FR004|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_NORD_FR004 - IT ToolBox|| IP_Solutions_Digital_Enablers|France_FGDC_FR006|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_FGDC_FR006 - HWG Digital Visual Management|| IP_Solutions_Digital_Enablers|France_FGDC_FR007|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_FGDC_FR007 - HWG Knowledge Base|| IP_Solutions_Digital_Enablers|France_FGDC_FR008|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_FGDC_FR008 - Impact Analysis|| IP_Solutions_Digital_Enablers|France_FGDC_FR009|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_FGDC_FR009 - Mapping Builder|| IP_Solutions_Digital_Enablers|France_FGDC_FR010|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_FGDC_FR010 - Sherlock|| IP_Solutions_Digital_Enablers|France_Finance_FR011|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Finance_FR011 - HWG Smart Case|| IP_Solutions_Digital_Enablers|France_Grand_Est_FR012|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Grand_Est_FR012 - TOY|| IP_Solutions_Digital_Enablers|France_Grand_Est_FR013|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Grand_Est_FR013 - WATCH|| IP_Solutions_Digital_Enablers|France_Grand_Ouest_FR014|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Grand_Ouest_FR014 - CEGEDIM CONFIGURATOR|| IP_Solutions_Digital_Enablers|France_Grand_Ouest_FR015|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Grand_Ouest_FR015 - MAP|| IP_Solutions_Digital_Enablers|France_CPG_Retail_North_FR016|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_CPG_Retail_North_FR016 - HWG Governance Intelligence|| IP_Solutions_Digital_Enablers|France_CPG_Retail_North_FR017|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_CPG_Retail_North_FR017 - HWG Supply Chain Intelligence|| IP_Solutions_Digital_Enablers|France_Transport_FR019|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Transport_FR019 - OpenENT|| IP_Solutions_Digital_Enablers|France_Transport_FR020|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Transport_FR020 - Workforce Data Vision|| IP_Solutions_Digital_Enablers|France_Grand_Ouest_FR021|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Grand_Ouest_FR021 - MAEVA|| IP_Solutions_Digital_Enablers|France_Telecom_FR023|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Telecom_FR023 - Mass Data Billing|| IP_Solutions_Digital_Enablers|France_Grand_Ouest_FR025|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_Grand_Ouest_FR025 - HWG ISA|| IP_Solutions_Digital_Enablers|Sweden_NR001|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR001 - Archives Solution|| IP_Solutions_Digital_Enablers|Finland_Estonia_NR002|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR002 - BI&Digital Business|| IP_Solutions_Digital_Enablers|Denmark_NR003|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Denmark_NR003 - Biochemical Clinical Laboratory Information System|| IP_Solutions_Digital_Enablers|Sweden_NR011|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR011 - FAGUS WOOD|| IP_Solutions_Digital_Enablers|Norway_NR019|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Norway_NR019 - License2Share (L2S)|| IP_Solutions_Digital_Enablers|Finland_Estonia_NR022|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Finland_Estonia_NR022 - Municipal software|| IP_Solutions_Digital_Enablers|Denmark_NR026|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Denmark_NR026 - Pathology Suite|| IP_Solutions_Digital_Enablers|UK_Energy_Utilities_UK005|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Energy_Utilities_UK005 - DCC Adapter|| IP_Solutions_Digital_Enablers|UK_OIL_GAS_CONS_SERV_UK011|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_OIL_GAS_CONS_SERV_UK011 - PRODIS (UK)|| IP_Solutions_Digital_Enablers|UK_OIL_GAS_CONS_SERV_UK012|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_OIL_GAS_CONS_SERV_UK012 - VantagePOB|| IP_Solutions_Digital_Enablers|UK_Energy_Utilities_UK013|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Energy_Utilities_UK013 - Internet of Things Platform (UK)|| IP_Solutions_Digital_Enablers|UK_OIL_GAS_CONS_SERV_UK014|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_OIL_GAS_CONS_SERV_UK014 - Information Hubs|| IP_Solutions_Digital_Enablers|UK_OIL_GAS_CONS_SERV_UK015|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_OIL_GAS_CONS_SERV_UK015 - Insurer Hosted Pricing|| IP_Solutions_Digital_Enablers|UK_Energy_Utilities_UK016|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Energy_Utilities_UK016 - Digital IP Consulting|| IP_Solutions_Digital_Enablers|UK_Energy_Utilities_UK017|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Energy_Utilities_UK017 - Data Services Provider|| IP_Solutions_Digital_Enablers|UK_Energy_Utilities_UK018|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Energy_Utilities_UK018 - EnergyRetail360|| IP_Solutions_Digital_Enablers|UK_Energy_Utilities_UK019|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Energy_Utilities_UK019 - Solutions for Energy|| IP_Solutions_Digital_Enablers|UK_BANKING_FINMARKET_UK020|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_BANKING_FINMARKET_UK020 - roHirst|| IP_Solutions_Digital_Enablers|UK_BANKING_FINMARKET_UK021|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_BANKING_FINMARKET_UK021 - Phoenix|| IP_Solutions_Digital_Enablers|UK_BANKING_FINMARKET_UK022|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_BANKING_FINMARKET_UK022 - CSS - SEPA IP|| IP_Solutions_Digital_Enablers|UK_BANKING_FINMARKET_UK023|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_BANKING_FINMARKET_UK023 - Partner IP - FS|| IP_Solutions_Digital_Enablers|UK_SDNS_UK025|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_SDNS_UK025 - CyberSecurity - IRIS|| IP_Solutions_Digital_Enablers|UK_SDNS_UK026|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_SDNS_UK026 - CyberSecurity - ATI|| IP_Solutions_Digital_Enablers|UK_HEALTH_LOCAL_SCOT_UK027|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_HEALTH_LOCAL_SCOT_UK027 - HWG DCP|| IP_Solutions_Digital_Enablers|IDAC_US024|NeverShare|Y|Y|N|N|||+|||||Unspecified||||IDAC_US024 - Atlas360|| IP_Solutions_Digital_Enablers|USEM_MidAtlantic_US028|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_MidAtlantic_US028 - eVA|| IP_Solutions_Digital_Enablers|HCP_US030|NeverShare|Y|Y|N|N|||+|||||Unspecified||||HCP_US030 - HWG Notify|| IP_Solutions_Digital_Enablers|USEM_ISBU_US032|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US032 - Insurance Fusion 360|| IP_Solutions_Digital_Enablers|RAP_US037|NeverShare|Y|Y|N|N|||+|||||Unspecified||||RAP_US037 - TAAMS|| IP_Solutions_Digital_Enablers|USEM_SOUTH_US041|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_SOUTH_US041 - ATSM|| IP_Solutions_Digital_Enablers|FGM_US042|NeverShare|Y|Y|N|N|||+|||||Unspecified||||FGM_US042 - AgileIQ Suite|| IP_Solutions_Digital_Enablers|FGM_US048|NeverShare|Y|Y|N|N|||+|||||Unspecified||||FGM_US048 - HWG AssureIQ|| IP_Solutions_Digital_Enablers|USEM_ISBU_US043|StoreData|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US043 - Universal Billing System|| IP_Solutions_Digital_Enablers|USEM_ISBU_US044|StoreData|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US044 - Insurance Writer|| IP_Solutions_Digital_Enablers|USEM_ISBU_US045|StoreData|Y|Y|N|N|||+|||||Unspecified||||USEM_ISBU_US045 - Stat Reporting|| IP_Solutions_Digital_Enablers|CSEE_CE027|NeverShare|Y|Y|N|N|||+|||||Unspecified||||CSEE_CE027 - Traffic360|| IP_Solutions_Digital_Enablers|UK_BANKING_FINMARKET_UK028|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_BANKING_FINMARKET_UK028 - TTR360|| IP_Solutions_Digital_Enablers|France_NORD_FR024|NeverShare|Y|Y|N|N|||+|||||Unspecified||||France_NORD_FR024 - HWG Retail Xp360|| IP_Solutions_Digital_Enablers|Netherlands_CE031|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE031 - Automated Pension Decl (GPA)|| IP_Solutions_Digital_Enablers|Netherlands_CE032|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE032 - Dynamic Case Management|| IP_Solutions_Digital_Enablers|Netherlands_CE033|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Netherlands_CE033 - BestDriver|| IP_Solutions_Digital_Enablers|Germany_CE034|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Germany_CE034 - HWG PreView|| #root|Unallocated|NeverShare|Y|Y|N|N|||~|||||Unspecified||||Unallocated Clients|| Unallocated|NA_Client|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Total from GL|| Unallocated|Balancing|DynamicCalc|Y|Y|N|N|||+|||||Unspecified||||Must be equal to zero to balance||IF (@ISMBR("Detail"))_ IF(@ISMBR(@REMOVE(@DESCENDANTS("Statistical"),@LIST(@IDESCENDANTS("Timelines"),"BL_Beg","BL_Ending","BL_Projection_Valid",@IDESCENDANTS("BU_Projection"),"BL_Consumption","BL_Activity","BL_FX_Rate",@IDESCENDANTS("BL_Bookings"),"BL_Backlog_Adj","BL_Backlog_Transfer"))))_ "NA_Client"-"Client_by_Vertical";_ ELSE_ #MISSING;_ ENDIF;_ ENDIF; Unallocated|Balancing_Tiers|DynamicCalc|Y|Y|N|N|||+|||||Unspecified||||Must be equal to zero to balance (Tier)||IF (@ISMBR("Detail"))_ "NA_Client"-"Tiers"; Unallocated|Bookings_BacklogAdj|DynamicCalc|Y|Y|N|N|||+|||||Unspecified||||Booking, Booking adj and Backlog Adj||IF(@ISMBR("BL_Bookings_New") OR @ISMBR("BL_Bookings_Adj") OR @ISMBR("BL_Backlog_Adj") OR @ISMBR("BL_Backlog_Transfer"))_ "Client_by_Vertical";_ ENDIF Unallocated|Negative_WIP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|Negative WIP|| Unallocated|Rebaseline|NeverShare|Y|Y|N|N|||+|||||Unspecified|||No_Sectors_Att|Client for rebaseline|| #root|Client_to_map|NeverShare|Y|Y|N|N|||~|||||Unspecified|||||| Client_to_map|Client_to_map_1|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_2|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_3|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_4|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_5|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_6|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_7|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_8|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_9|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_10|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_11|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_12|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_13|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_14|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_15|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_16|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_17|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_18|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_19|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_20|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_21|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_22|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_23|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_24|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_25|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_26|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_27|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_28|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_29|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_30|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_31|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_32|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_33|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_34|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_35|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_36|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_37|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_38|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_39|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_40|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_41|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_42|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_43|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_44|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_45|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_46|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_47|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_48|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_49|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_50|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_51|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_52|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_53|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_54|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_55|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_56|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_57|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_58|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_59|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_60|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_61|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_62|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_63|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_64|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_65|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_66|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_67|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_68|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_69|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_70|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_71|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_72|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_73|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_74|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_75|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_76|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_77|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_78|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_79|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_80|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_81|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_82|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_83|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_84|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_85|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_86|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_87|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_88|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_89|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_90|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_91|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_92|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_93|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_94|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_95|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_96|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_97|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_98|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_99|NeverShare|Y|Y|N|N|||~|||||Text|||||| Client_to_map|Client_to_map_100|NeverShare|Y|Y|N|N|||~|||||Text|||||| #root|Client_to_Delete|NeverShare|Y|Y|N|N|||~|||||Unspecified|||||| Client_to_Delete|GMA_PSC_CA035|NeverShare|Y|Y|N|N|||+|||||Unspecified||||GMA_PSC_CA035 - PragmaCONSOLE|| Client_to_Delete|UK_Finance_UK024|NeverShare|Y|Y|N|N|||+|||||Unspecified||||UK_Finance_UK024 - FS IP Pending master list|| Client_to_Delete|USEM_Northeast_US034|NeverShare|Y|Y|N|N|||+|||||Unspecified||||USEM_Northeast_US034 - Massachusetts Automobile Insurance|| Client_to_Delete|Sweden_NR006|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR006 - CRIMSON|| Client_to_Delete|Sweden_NR007|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR007 - EMO|| Client_to_Delete|Sweden_NR008|NeverShare|Y|Y|N|N|||+|||||Unspecified||||Sweden_NR008 - HWG MEG|| Client_to_Delete|France_Retail_FR003|NeverShare|Y|Y|N|N|||~|||||Unspecified||||France_Retail_FR003 - InStore Tablet Clienteling Solution|| Client_to_Delete|France_Retail_FR005|NeverShare|Y|Y|N|N|||~|||||Unspecified||||France_Retail_FR005 - WholeSales Tablet Order Intake Solution|| Client_to_Delete|France_Retail_FR022|NeverShare|Y|Y|N|N|||~|||||Unspecified||||France_Retail_FR022 - HWG Reflow|| Client_to_Delete|BU_UK_Oil_Gas_CONS_SERV_Temp|NeverShare|Y|Y|N|N|||~|||||Unspecified|||||| Client_to_Delete|FGM_US047|NeverShare|Y|Y|N|N|||~|||||Unspecified||||FGM_US047 - Unify360 Portfolio Manager|| Client_to_Delete|BU_USEM_Central_South_Total|NeverShare|Y|Y|N|N|||~|||||Unspecified|||||| Client_to_Delete|USEM_ISBU_US011|NeverShare|Y|Y|N|N|||~|||||Unspecified||||USEM_ISBU_US011 - Payments360 LAPS HC|| Client_to_Delete|GMA_FIN_CA024|NeverShare|Y|Y|N|N|||~|||||Unspecified||||GMA_FIN_CA024 - Mobility Gateway|| Client_to_Delete|Denmark_NR043|NeverShare|Y|Y|N|N|||~|||||Unspecified||||Denmark_NR043 - HWG Planning360|| #root|Step_Legend|NeverShare|Y|Y|N|N|||~|||||Unspecified||||Legend|| #root|NA_Client_WC|NeverShare|Y|Y|N|N|||+|||||Unspecified||||NA Client (Working Capital)|| !Hierarchies=Currency 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|DataType|Symbol|Scale|ThousandSep|DecimalSep|NegativeSign|NegativeColor|ReptCurrency|TriangulationCurrency|CurrencyCode|SmartList|TwoPassCalc|Alias=Default|Description|BSOMemberFormula #root|Local|StoreData|Y|Y|N|N|||Unspecified|null|Whole|None|Dot|Prefixed Minus|Black|N||||||Local currency| #root|CAD|StoreData|Y|Y|N|N|||Unspecified|$|Whole|Comma|Dot|Prefixed Minus|Red|Y||||||Canadian Dollar| #root|AUD|StoreData|Y|Y|N|N|||Unspecified|A$|Whole|Comma|Dot|Prefixed Minus|Red|Y||||||Australia dollar| #root|EUR|StoreData|Y|Y|N|N|||Unspecified|€|Whole|Comma|Dot|Prefixed Minus|Red|Y||||||European Union Euro| #root|GBP|StoreData|Y|Y|N|N|||Unspecified|£|Whole|Comma|Dot|Prefixed Minus|Red|Y||||||United Kingdom pound| #root|PLN|StoreData|Y|Y|N|N|||Unspecified|PLN|Whole|Comma|Dot|Prefixed Minus|Red|Y||||||Poland Zloty| #root|USD|StoreData|Y|Y|N|N|||Unspecified|$|Whole|Comma|Dot|Prefixed Minus|Red|Y||||||United States of America dollar| #root|DKK|StoreData|Y|Y|N|N|||Unspecified|Dkr|Whole|None|Dot|Prefixed Minus|Black|Y||||||Denmark krone| #root|INR|StoreData|Y|Y|N|N|||Unspecified|Rs|Whole|None|Dot|Prefixed Minus|Black|Y||||||India rupee| #root|MAD|StoreData|Y|Y|N|N|||Unspecified|MAD|Whole|None|Dot|Prefixed Minus|Black|Y||||||Moroccan Dirham| #root|NOK|StoreData|Y|Y|N|N|||Unspecified|NKr|Whole|None|Dot|Prefixed Minus|Black|Y||||||Norway krone| #root|SEK|StoreData|Y|Y|N|N|||Unspecified|Sk|Whole|None|Dot|Prefixed Minus|Black|Y||||||Sweden krona| !Hierarchies=Detail 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|Plan1Aggregation|Plan2Aggregation|Plan3Aggregation|WorkforceAggregation|CapexAggregation|DataType|SmartList|TwoPassCalc|Alias=Default|Description|BSOMemberFormula #root|Integration_Cost_Detail|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Integration_Cost_Detail|Severance_Int_Cost|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Severance Int. Cost|| Integration_Cost_Detail|Real_Estate_Int_Cost|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Real Estate Int. Cost|| Integration_Cost_Detail|Other_Int_Cost|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Other Int. Cost|| #root|PPP_Detail|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| PPP_Detail|Local_PPP_Accrual|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Local PPP Accrual|| PPP_Detail|Commissions_Accrual|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Commissions Accrual|| PPP_Detail|Fringe_Accrual_Global_PPP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Fringe Accrual Global_PPP|| PPP_Detail|Global_PPP|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Global PPP|| #root|Backlog_Detail|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2014|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2015|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2016|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2017|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2018|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2019|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2020|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2021|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|FY2022|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Backlog_Detail|Next_Years|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| #root|Mapping_Detail|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| Mapping_Detail|PSA_Map|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| PSA_Map|PSA_OU|NeverShare|Y|Y|N|N|||+|||||Text|||PSA OU|| PSA_Map|PSA_ID|NeverShare|Y|Y|N|N|||+|||||Text|||PSA ID|| PSA_Map|PSA_Name|NeverShare|Y|Y|N|N|||+|||||Text|||PSA Client Name|| PSA_Map|PSA_Map_ID|NeverShare|Y|Y|N|N|||+|||||Text|||RP Client ID|| PSA_Map|PSA_Map_Name|NeverShare|Y|Y|N|N|||+|||||Text|||RP Client Name (New)|| PSA_Map|PSA_Map_Action_New|NeverShare|Y|Y|N|N|||+|||||SmartList|Action_New_Request||Action (New)|| PSA_Map|PSA_Map_Comment|NeverShare|Y|Y|N|N|||+|||||Text|||PSA Comments|| PSA_Map|PSA_Map_Action_Update|NeverShare|Y|Y|N|N|||+|||||SmartList|Action_Corrections||Action (Update)|| Mapping_Detail|PSA_Update|NeverShare|Y|Y|N|N|||+|||||Unspecified|||PSA Update|| PSA_Update|PSA_OU_|NeverShare|Y|Y|N|N|||+|||||Text|||OU|| PSA_Update|PSA_ID_|NeverShare|Y|Y|N|N|||+|||||Text|||ID|| PSA_Update|PSA_Name_|NeverShare|Y|Y|N|N|||+|||||Text|||Name|| PSA_Update|PSA_Map_ID_|NeverShare|Y|Y|N|N|||+|||||Text|||RP Client ID (Update)|| PSA_Update|PSA_Map_Comment_|NeverShare|Y|Y|N|N|||+|||||Text|||PSA Comment(s)|| Mapping_Detail|CRM_Map|StoreData|Y|Y|N|N|||+|||||Unspecified||||| CRM_Map|CRM_Territory|NeverShare|Y|Y|N|N|||+|||||Text|||CRM Territory|| CRM_Map|CRM_ID|NeverShare|Y|Y|N|N|||+|||||Text|||CRM Client ID|| CRM_Map|CRM_Name|NeverShare|Y|Y|N|N|||+|||||Text|||CRM Client Name|| CRM_Map|CRM_Curr|NeverShare|Y|Y|N|N|||+|||||Text||||| CRM_Map|CRM_Map_ID|NeverShare|Y|Y|N|N|||+|||||Text|||RP Client ID - New|| CRM_Map|CRM_Map_Name|NeverShare|Y|Y|N|N|||+|||||Text|||RP Client Name - New|| CRM_Map|CRM_Map_Action_New|NeverShare|Y|Y|N|N|||+|||||SmartList|Action_New_Requests_CRM||Action - New|| CRM_Map|CRM_Map_Comment|NeverShare|Y|Y|N|N|||+|||||Text|||CRM Comments|| CRM_Map|CRM_Map_Action_Update|NeverShare|Y|Y|N|N|||+|||||SmartList|Action_Corrections||Action - Update|| Mapping_Detail|CRM_Update|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| CRM_Update|CRM_Territory_|NeverShare|Y|Y|N|N|||+|||||Text|||Territory|| CRM_Update|CRM_ID_|NeverShare|Y|Y|N|N|||+|||||Text|||Client ID - Update|| CRM_Update|CRM_Name_|NeverShare|Y|Y|N|N|||+|||||Text|||Client Name - Update|| CRM_Update|CRM_Map_ID_|NeverShare|Y|Y|N|N|||+|||||Text|||RP Client ID - Update|| CRM_Update|CRM_Map_Comment_|NeverShare|Y|Y|N|N|||+|||||Text|||CRM Comment(s)|| #root|Tax_Credit_Movement|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Tax Credit Movement|| Tax_Credit_Movement|Cash_Received|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Cash Received (-)|| Tax_Credit_Movement|New_Claims|NeverShare|Y|Y|N|N|||+|||||Unspecified|||New Claims (+)|| Tax_Credit_Movement|Tax_Reserves|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Reserves (-)|| Tax_Credit_Movement|Asset_Capitalization|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Asset Capitalization (-)|| Tax_Credit_Movement|Other_Adjustments|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Other Adjustments (+)|| #root|Upload|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| #root|Adjustment|NeverShare|Y|Y|N|N|||+|||||Unspecified||||| #root|Comments|NeverShare|Y|Y|N|N|||~|||||Unspecified||||| #root|Comments_QTR|NeverShare|Y|Y|N|N|||~|||||Unspecified||||| #root|Comments_YTD|NeverShare|Y|Y|N|N|||~|||||Unspecified||||| #root|Aging_Detail|NeverShare|Y|Y|N|N|||+|||||Unspecified|||Aging Detail|| Aging_Detail|01_30_Days|NeverShare|Y|Y|N|N|||+|||||Currency|||1-30 Days Total|| 01_30_Days|01_30_Days_Upload|NeverShare|Y|Y|N|N|||+|||||Currency|||1-30 Days Upload|| 01_30_Days|01_30_Days_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|||1-30 Days Adj|| Aging_Detail|31_60_Days|NeverShare|Y|Y|N|N|||+|||||Currency|||31-60 Days Total|| 31_60_Days|31_60_Days_Upload|NeverShare|Y|Y|N|N|||+|||||Currency|||31-60 Days Upload|| 31_60_Days|31_60_Days_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|||31-60 Days Adj|| Aging_Detail|61_90_Days|NeverShare|Y|Y|N|N|||+|||||Currency|||61-90 Days Total|| 61_90_Days|61_90_Days_Upload|NeverShare|Y|Y|N|N|||+|||||Currency|||61-90 Days Upload|| 61_90_Days|61_90_Days_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|||61-90 Days Adj|| Aging_Detail|Over_90_Days|NeverShare|Y|Y|N|N|||+|||||Currency|||Over 90 Days Total|| Over_90_Days|Over_90_Days_Upload|NeverShare|Y|Y|N|N|||+|||||Currency|||Over 90 Days Upload|| Over_90_Days|Over_90_Days_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|||Over 90 Days Adj|| Aging_Detail|AFDA_Total|NeverShare|Y|Y|N|N|||+|||||Currency|||AFDA Total|| Aging_Detail|Short_Term|NeverShare|Y|Y|N|N|||+|||||Currency|||ST Total|| Short_Term|ST_Upload|NeverShare|Y|Y|N|N|||+|||||Currency|||ST Upload|| Short_Term|ST_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|||ST Adj|| Aging_Detail|Long_Term|NeverShare|Y|Y|N|N|||+|||||Currency|||LT Total|| Long_Term|LT_Upload|NeverShare|Y|Y|N|N|||+|||||Currency|||LT Upload|| Long_Term|LT_Adj|NeverShare|Y|Y|N|N|||+|||||Currency|||LT Adj|| !Hierarchies=Entity 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|Plan1Aggregation|Plan2Aggregation|Plan3Aggregation|WorkforceAggregation|CapexAggregation|DataType|Currency|SmartList|TwoPassCalc|Alias=Default|Description|BSOMemberFormula #root|HWG|NeverShare|Y|Y|N|N|||~|||||Unspecified|CAD||||| HWG|HWG_Ops|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||HWG - Ops|| HWG_Ops|Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| Canada|Atlantic_SCU|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - Atlantic and SCU|| Canada|GMA_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GMA Parent|| GMA_Parent|GM_CPS|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GM CPS|| GMA_Parent|GMA_FIN|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GMA FIN|| GMA_Parent|GMA_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||Canada - GMA (USD)|| Canada|GTO_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTO|| GTO_Canada|GTO_T1_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTO Tier1 Parent|| GTO_T1_Parent|GTO_T1|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTO Tier1|GIS_T1_CAD| GTO_T1_Parent|GTO_T1_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||Canada - GTO Tier1 (USD)|| GTO_Canada|GTO_DMS|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTO DMS|| GTO_Canada|EVP_GTO|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - EVP GTO|| GTO_Canada|GTO_Adj|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTO Adjustments|| Canada|GTA_CPS_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTA CPS Parent|| GTA_CPS_Parent|GTA_CPS|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTA CPS|| GTA_CPS_Parent|GTA_CPS_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||Canada - GTA CPS (USD)|| Canada|GTA_BKS_Parent|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTA BKS Parent|| GTA_BKS_Parent|GTA_BKS|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GTA BKS|| GTA_BKS_Parent|GTA_BKS_USD|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||Canada - GTA BKS (USD)|| Canada|NCR|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - NCR|| Canada|Quebec|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - Quebec|| Canada|West_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - Western Canada|| Canada|EVP_Canada|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - EVP|| Canada|Eliminations|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - Elims|| Canada|Can_Adj|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - Adjustments|| HWG_Ops|USA|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| USA|Federal_Group|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - Federal Group|| Federal_Group|FGM|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - Federal - FGM|| Federal_Group|DEF_GSS|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - Federal - DEF and GSS|| Federal_Group|HCP|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - Federal - HCP|| Federal_Group|SAJE|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - Federal - SAJE|| Federal_Group|RAP|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - Federal - RAP|| Federal_Group|IDAC|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - Federal - IDAC|| USA|USEM|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM|| USEM|USEM_New_England|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - New England|| USEM|USEM_Central|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - Central|| USEM|USEM_South|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - South|| USEM|USEM_ISBU|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - ISBU|| USEM|USEM_Mid_Atlantic|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - Mid-Atlantic|| USEM|USEM_East|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - East|| USEM|USEM_West|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - West|| USEM|USEM_Shared|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - Shared|| USEM|USEM_GISOD|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - USEM - GISOD|| USA|EVP_USA|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||USA - EVP|| USA|USA_Adj|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||USA - Adjustments|| HWG_Ops|United_Kingdom|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom|| United_Kingdom|UK_SDNS|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - SDNS|| United_Kingdom|UK_Energy_Utilities|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - Energy and Utilities|| United_Kingdom|UK_Oil_Gas_Cons_Serv|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - Oil Gas & Consulting Service|| United_Kingdom|UK_Banking_Fin_Market|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - Banking and Finance Market|| United_Kingdom|UK_Global_Tech_Ops|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - Global Tech Ops|| United_Kingdom|UK_Cent_Gov_Justice|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - Cent Gov Justice|| United_Kingdom|UK_Health_Local_Scot|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - Health and Local SCOT|| United_Kingdom|EVP_UK_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||UK Total - EVP|| EVP_UK_Total|EVP_UK_Historical|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||UK Historical - EVP|| EVP_UK_Total|EVP_UK|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||United Kingdom - EVP|| HWG_Ops|ECS|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR||||| ECS|Germany|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||ECS - Germany|| ECS|Netherlands|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||ECS - Netherlands|| ECS|Poland|NeverShare|Y|Y|N|N|||+|||||Unspecified|PLN|||ECS - Poland|| ECS|Belgium|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||ECS - Belgium|| ECS|Spain_Italy_Portugal|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||ECS - Spain, Italy and Portugal|| ECS|Brazil|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||ECS - Brazil|| ECS|South_America|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||ECS - South America|| South_America|South_America_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||ECS - South America (Non-PSA)|| ECS|CSEE|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||ECS - CSEE|| ECS|Shell|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||ECS - Shell|| ECS|EVP_ECS|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||ECS - EVP|| HWG_Ops|Nordics|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| Nordics|Finland_Estonia|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||Nordics - Finland and Estonia|| Nordics|Sweden|NeverShare|Y|Y|N|N|||+|||||Unspecified|SEK|||Nordics - Sweden|| Nordics|Denmark|NeverShare|Y|Y|N|N|||+|||||Unspecified|DKK|||Nordics - Denmark|| Nordics|Norway|NeverShare|Y|Y|N|N|||+|||||Unspecified|NOK|||Nordics - Norway|| Nordics|GTO_Nordics|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Nordics - GTO|| Nordics|EVP_Nordics|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Nordics - EVP|| HWG_Ops|France|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR||||| France|France_Bus_Cons|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Business Consulting|| France|France_Manufacturing|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Manufacturing|| France|France_Telecom|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Telecommunication|| France|France_Retail|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Retail|| France|France_Transport|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Transport|| France|France_Finance|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Finance|| France|France_Grand_Ouest|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Grand Ouest|| France|France_Grand_Est|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Grand Est|| France|France_FGDC|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - FGDC|| France|France_ICE|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - ICE|| France|France_Nord|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Nord|| France|France_Alcyane|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Alcyane|| France|EVP_France_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France Total - EVP|| EVP_France_Total|EVP_France_Historical|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France Historical - EVP|| EVP_France_Total|EVP_France|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - EVP|| HWG_Ops|Asia_Pacific|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Asia and Pacific|| Asia_Pacific|India_Total|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR||||| India_Total|India_CME|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||Asia Pacific - India CME|| India_Total|India_BFSI|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||Asia Pacific - India BFSI|| India_Total|India_MRD|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||Asia Pacific - India MRD|| India_Total|India_Solutions|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||Asia Pacific - India Solutions|| India_Total|India_GIS|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||Asia Pacific - India GIS|| India_Total|India_SUPT|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||Asia Pacific - India SUPT|| India_Total|India_Admin|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||Asia Pacific - India Admin|| Asia_Pacific|South_East_Asia|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Asia Pacific - South East Asia|| Asia_Pacific|Middle_East_Asia|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Asia Pacific - Middle East Asia|| Middle_East_Asia|Middle_East_Asia_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Asia Pacific - Middle East Asia (Non-PSA)|| Asia_Pacific|Australia|NeverShare|Y|Y|N|N|||+|||||Unspecified|AUD|||Asia Pacific - Australia|| Asia_Pacific|EVP_Asia_Pacific|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Asia Pacific - EVP|| HWG|Corporate|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||HWG - Corpo|| Corporate|Corp|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| Corp|Corp_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Corp - PSA|| Corp|Corp_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Corp - Non-PSA|| Corporate|Fin_Rep_Adj|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Financial Reporting Adjustments|| Corporate|Elim|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| #root|Inactives|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| Inactives|Global_Accounts|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Global Accounts|| Inactives|Eastern_Europe|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||Eastern Europe|| Inactives|France_Learning|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France Learning Solutions|| Inactives|UK_Government|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||UK - Government|| Inactives|Poland_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|PLN|||Poland - PSA|| Inactives|Poland_Non_PSA|NeverShare|Y|Y|N|N|||+|||||Unspecified|PLN|||Poland - Non-PSA|| Inactives|Spain_Italy|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||Spain and Italy|| Inactives|Portugal|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR||||| Inactives|GTA_CAD_Old|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||GTA (CAD) old|| Inactives|CSB|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| Inactives|CACI|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD||||| Inactives|GIS_USA|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||GIS USA|| Inactives|FGM_Temp|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD||||| Inactives|NSDP|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||Federal - NSDP|| Inactives|ADP|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||Federal - Army, Defence and Intelligence|| Inactives|CAP|NeverShare|Y|Y|N|N|||+|||||Unspecified|USD|||Federal - Civilian Agency Programs|| Inactives|EVP_UK_Temp|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP||||| Inactives|UK_Commercial|NeverShare|Y|Y|N|N|||+|||||Unspecified|GBP|||UK - Commercial|| Inactives|EVP_ECS_Temp|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR||||| Inactives|Switzerland|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR||||| Inactives|India|NeverShare|Y|Y|N|N|||+|||||Unspecified|INR|||India Outsourcing|| Inactives|France_Production|NeverShare|Y|Y|N|N|||+|||||Unspecified|EUR|||France - Production Industrielle|| Inactives|Morocco|NeverShare|Y|Y|N|N|||+|||||Unspecified|MAD||||| Inactives|CIA|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| Inactives|Innovapost|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD||||| Inactives|USEM_Central_South|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||USA - USEM - Central and South|| Inactives|UK_Public|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||United Kingdom - Public Sector|| Inactives|GMA|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GMA (CAD)|| Inactives|PSC|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - PSC|| Inactives|GMA_PSC|NeverShare|Y|Y|N|N|||+|||||Unspecified|CAD|||Canada - GMA and PSC|| #root|Entity_Sanity_Test|NeverShare|Y|Y|N|N|||~|||||Unspecified|CAD|||Entity - Sanity Test|| #root|Test_Sal|NeverShare|Y|Y|N|N|||~|||||Unspecified|CAD|||Test Sal|| !Hierarchies=Period 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|Plan1Aggregation|Plan2Aggregation|Plan3Aggregation|WorkforceAggregation|CapexAggregation|PeriodType|DataType|SmartList|TwoPassCalc|DTSGeneration|DTSEnabled|Alias=Default|Description|BSOMemberFormula #root|Y-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||0|N||DTS Year to Date| #root|H-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||2|Y|HTD|DTS History to Date| #root|S-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||0|N||DTS Season to Date| #root|Q-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||3|Y|QTD|DTS Quarter to Date| #root|P-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||0|N||DTS Period to Date| #root|M-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||0|N||DTS Month to Date| #root|W-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||0|N||DTS Week to Date| #root|D-T-D|StoreData|Y|Y|N|N|||+|||||DTS Time Period|Unspecified|||0|N||DTS Day to Date| #root|BegBalance|StoreData|Y|Y|N|N|||~|||||Base Time Period|Unspecified|||0|N||| #root|YearTotal|DynamicCalc|Y|Y|N|N|||+|||||Year Time Period|Unspecified|||0|N||| YearTotal|Q1|DynamicCalc|Y|Y|N|N|||+|||||Summary Time Period|Unspecified|||0|N||| Q1|Oct|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q1|Nov|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q1|Dec|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| YearTotal|Q2|DynamicCalc|Y|Y|N|N|||+|||||Summary Time Period|Unspecified|||0|N||| Q2|Jan|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q2|Feb|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q2|Mar|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| YearTotal|Q3|DynamicCalc|Y|Y|N|N|||+|||||Summary Time Period|Unspecified|||0|N||| Q3|Apr|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q3|May|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q3|Jun|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| YearTotal|Q4|DynamicCalc|Y|Y|N|N|||+|||||Summary Time Period|Unspecified|||0|N||| Q4|Jul|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q4|Aug|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| Q4|Sep|StoreData|Y|Y|N|N|||+|||||Base Time Period|Unspecified|||0|N||| !Hierarchies=Scenario 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|Plan1Aggregation|Plan2Aggregation|Plan3Aggregation|WorkforceAggregation|CapexAggregation|DataType|StartYear|EndYear|StartPeriod|EndPeriod|UseBegBalance|EnableProcessManagement|SmartList|ExchangeRateTable|TwoPassCalc|Alias=Default|Description|BSOMemberFormula #root|Actual|StoreData|Y|Y|N|N|||~|||||Unspecified|FY17|FY17|May|Sep|N|Y||Actual_Rate|||| #root|MoM|DynamicCalc|Y|Y|N|N|||~|||||Unspecified|FY07|FY16|Oct|Sep|N|N||||Month over Month||IF (@ISMBR("Oct"))_ "Actual"-@MDSHIFT("Actual",-1,Year,,11,"Period",);_ ELSE_ "Actual"-@PRIOR("Actual");_ ENDIF; #root|QoQ|DynamicCalc|Y|Y|N|N|||~|||||Unspecified|FY07|FY16|Oct|Sep|N|N||||Quarter over Quarter||IF (@ISMBR("Oct") OR @ISMBR("Nov") OR @ISMBR("Dec"))_ "Actual"-@MDSHIFT("Actual",-1,Year,,9,"Period",);_ ELSEIF (@ISMBR("Jan"))_ "Actual"-"Actual"->"Oct";_ ELSEIF (@ISMBR("Feb"))_ "Actual"-"Actual"->"Nov";_ ELSEIF (@ISMBR("Mar"))_ "Actual"-"Actual"->"Dec";_ ELSEIF (@ISMBR("Apr"))_ "Actual"-"Actual"->"Jan";_ ELSEIF (@ISMBR("May"))_ "Actual"-"Actual"->"Feb";_ ELSEIF (@ISMBR("Jun"))_ "Actual"-"Actual"->"Mar";_ ELSEIF (@ISMBR("Jul"))_ "Actual"-"Actual"->"Apr";_ ELSEIF (@ISMBR("Aug"))_ "Actual"-"Actual"->"May";_ ELSEIF (@ISMBR("Sep"))_ "Actual"-"Actual"->"Jun";_ ENDIF; #root|YoY|DynamicCalc|Y|Y|N|N|||~|||||Unspecified|FY07|FY16|Oct|Sep|N|N||||Year over Year||"Actual"-@MDSHIFT("Actual",-1,"Year",); #root|YTD|DynamicCalc|Y|Y|N|N|||~|||||Unspecified|FY07|FY16|Oct|Sep|N|N||||||IF (@ISMBR(Oct))_ Actual-@MDSHIFT(Actual,-1,Year,,11,Period,);_ ELSEIF (@ISMBR(Nov))_ Actual-@MDSHIFT(Actual,-1,Year,,10,Period,);_ ELSEIF (@ISMBR(Dec))_ Actual-@MDSHIFT(Actual,-1,Year,,9,Period,);_ ELSEIF (@ISMBR(Jan))_ Actual-@MDSHIFT(Actual,-1,Year,,8,Period,);_ ELSEIF (@ISMBR(Feb))_ Actual-@MDSHIFT(Actual,-1,Year,,7,Period,);_ ELSEIF (@ISMBR(Mar))_ Actual-@MDSHIFT(Actual,-1,Year,,6,Period,);_ ELSEIF (@ISMBR(Apr))_ Actual-@MDSHIFT(Actual,-1,Year,,5,Period,);_ ELSEIF (@ISMBR(May))_ Actual-@MDSHIFT(Actual,-1,Year,,4,Period,);_ ELSEIF (@ISMBR(Jun))_ Actual-@MDSHIFT(Actual,-1,Year,,3,Period,);_ ELSEIF (@ISMBR(Jul))_ Actual-@MDSHIFT(Actual,-1,Year,,2,Period,);_ ELSEIF (@ISMBR(Aug))_ Actual-@MDSHIFT(Actual,-1,Year,,1,Period,);_ ELSEIF (@ISMBR(Sep))_ Actual-@MDSHIFT(Actual,-1,Year,,0,Period,);_ ENDIF; #root|Budget|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY17|FY17|Oct|Sep|N|N||Budget_Rate|||| #root|Forecast|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY17|FY17|Jun|Sep|N|N||Forecast_Rate|||| #root|PrevFcst|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY14|FY16|Sep|Sep|N|N||Forecast_Rate|||| #root|FCSTvsBUD|DynamicCalc|Y|Y|N|N|||~|||||Unspecified|FY07|FY16|Oct|Sep|N|N||||Forecast vs Budget||"Forecast"-"Budget"; #root|Budrate|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY12|FY14|Oct|Sep|N|N||Budrate_Rate|||| #root|Mapp_Prelim|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY17|FY17|Oct|Sep|N|N|||||| #root|Mapp_New|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY17|FY17|Oct|Sep|N|N|||||| #root|Forecast_Input|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY17|FY17|May|Sep|N|N||Forecast_Rate|||| #root|Act_FutureBudrate|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY16|FY16|Oct|Sep|N|N||FutureBudrate_Rate|||| #root|Client_Budget|NeverShare|Y|Y|N|N|||~|||||Unspecified|FY18|FY18|Oct|Sep|N|N||Budget_Rate|||| !Hierarchies=Version 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|Plan1Aggregation|Plan2Aggregation|Plan3Aggregation|WorkforceAggregation|CapexAggregation|DataType|VersionType|EnableProcessManagement|SmartList|TwoPassCalc|Alias=Default|Description|BSOMemberFormula #root|Working|StoreData|Y|Y|N|N|||~|||||Unspecified|BottomUp|Y||||| #root|Temp|StoreData|Y|Y|N|N|||~|||||Unspecified|BottomUp|N||||| #root|Draft|StoreData|Y|Y|N|N|||~|||||Unspecified|BottomUp|N||||| !Hierarchies=Year 'Parent|Child|DataStorage|IsPrimary|MemberValidForPlan1|MemberValidForPlan2|MemberValidForPlan3|MemberValidForWorkforce|MemberValidForCapex|DataType|SmartList|TwoPassCalc|Alias=Default|Description|BSOMemberFormula #root|FY07|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY08|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY09|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY10|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY11|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY12|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY13|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY14|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY15|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY16|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY17|StoreData|Y|Y|N|N|||Unspecified||||| #root|FY18|StoreData|Y|Y|N|N|||Unspecified||||| #root|No Year|StoreData|Y|Y|N|N|||Unspecified||||No Year| !Hierarchies=Action_Corrections 'Parent|Child|SmartListEntryLabel|ItemValue #root|Create_New_Client|Create New Client|1 #root|Change_Mapping|Change Mapping|2 !Hierarchies=Action_New_Request 'Parent|Child|SmartListEntryLabel|ItemValue #root|Create_New_Client|Create New Client|1 #root|Change_Mapping_To_Existing_RP_Client|Change Mapping to Existing RP Client|2 #root|Change_Mapping_To_New_RP_Client|Change Mapping to New RP Client|3 #root|Rename_Client|Rename Client|4 #root|Remove_Client|Remove Client|5 !Hierarchies=Action_New_Requests 'Parent|Child|SmartListEntryLabel|ItemValue #root|Create_New_Client|Create New Client|1 #root|Change_Mapping|Change Mapping|2 #root|Rename_Client|Rename Client|3 #root|Remove_Mapping|Remove Mapping|4 !Hierarchies=Action_New_Requests_CRM 'Parent|Child|SmartListEntryLabel|ItemValue #root|Change_Mapping|Change Mapping|1 #root|Create_Client|Rename Client|2 #root|Remove_Mapping|Remove Mapping|3 !Hierarchies=Alias 'Parent|Child #root|Default
joakim-strandberg/wayland_ada_binding
Ada
141
ads
with Linux.Text_IO; package Client_Examples is procedure Put_Line (Text : String) renames Linux.Text_IO.Put_Line; end Client_Examples;
AdaCore/libadalang
Ada
596
adb
procedure Test_Gen is generic I : Integer; package Generic_Pkg is function P (X : Integer) return Integer; pragma Find_All_References (Any, Follow_Renamings => True); end Generic_Pkg; package body Generic_Pkg is function P (X : Integer) return Integer is begin return I; end P; pragma Find_All_References (Any, Follow_Renamings => True); end Generic_Pkg; package Pkg is new Generic_Pkg (I => 42); function P_42 (X : Integer) return Integer renames Pkg.P; Ip : Integer := P_42 (34); begin null; end Test_Gen;
AdaCore/libadalang
Ada
159
adb
procedure Test is b_true : Boolean := True; result : Boolean; begin result := Boolean'succ( Boolean'pred( b_true )); pragma Test_Statement; end Test;
freebsd/freebsd-ports
Ada
595
adb
--- src/portscan-buildcycle.adb.orig 2017-04-20 10:12:27.241713000 +1200 +++ src/portscan-buildcycle.adb 2017-04-20 10:12:38.218162000 +1200 @@ -570,7 +570,7 @@ status : Unix.process_exit; lock_lines : Natural; quartersec : one_minute := one_minute'First; - hangmonitor : constant Boolean := True; + hangmonitor : constant Boolean := False; synthexec : constant String := host_localbase & "/libexec/synthexec"; truecommand : constant String := synthexec & " " & log_name (trackers (id).seq_id) & " " & command;
onox/orka
Ada
741
ads
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2016 onox <[email protected]> -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. package Orka.Transforms.Doubles is pragma Pure; end Orka.Transforms.Doubles;
reznikmm/matreshka
Ada
4,776
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Visitors; with ODF.DOM.Number_Embedded_Text_Elements; package Matreshka.ODF_Number.Embedded_Text_Elements is type Number_Embedded_Text_Element_Node is new Matreshka.ODF_Number.Abstract_Number_Element_Node and ODF.DOM.Number_Embedded_Text_Elements.ODF_Number_Embedded_Text with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Number_Embedded_Text_Element_Node; overriding function Get_Local_Name (Self : not null access constant Number_Embedded_Text_Element_Node) return League.Strings.Universal_String; overriding procedure Enter_Node (Self : not null access Number_Embedded_Text_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); overriding procedure Leave_Node (Self : not null access Number_Embedded_Text_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); overriding procedure Visit_Node (Self : not null access Number_Embedded_Text_Element_Node; Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); end Matreshka.ODF_Number.Embedded_Text_Elements;
stcarrez/ada-servlet
Ada
999
ads
----------------------------------------------------------------------- -- servlet -- Ada Servlet -- Copyright (C) 2009, 2010, 2018 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- -- Ada Servlet is an adapted implementation of JSR 154 and 315, -- the Java Servlet for Ada 2005. package Servlet is pragma Pure; end Servlet;
JeremyGrosser/clock3
Ada
2,241
adb
with Board; use Board; with SAMD21.Device; with HAL.I2C; with HT16K33; with Seven; with ESP8266; with HAL; use HAL; package body Clock is function Hour_Offset (UTC : Integer; Offset : Integer) return Integer is begin if (UTC + Offset) < 0 then return UTC + 24 + Offset; elsif (UTC + Offset) > 24 then return UTC - 24 + Offset; else return UTC + Offset; end if; end Hour_Offset; procedure Initialize is UTC_Hour, Minute, Second : Natural; begin Board.Initialize; SAMD21.Device.I2C_1.Enable; Display_1.Initialize; Display_2.Initialize; Display_3.Initialize; Display_1.Set_Brightness (HT16K33.Brightness_Level'First); Display_2.Set_Brightness (HT16K33.Brightness_Level'First); Display_3.Set_Brightness (HT16K33.Brightness_Level'First); ESP8266.Initialize; ESP8266.Enable; ESP8266.Get_Time (UTC_Hour, Minute, Second); ESP8266.Disable; Set_RTC (UTC_Hour, Minute, Second); Display_1.Clear_All; Display_2.Clear_All; Display_3.Clear_All; Display_1.Update; Display_2.Update; Display_3.Update; --Disable_Interrupt (15); -- No SysTick after startup end Initialize; procedure Update is UTC_Hour, EST_Hour, PST_Hour, Minute, Second : Natural; begin Get_RTC (UTC_Hour, Minute, Second); EST_Hour := Natural (Hour_Offset (UTC_Hour, -5)); PST_Hour := Natural (Hour_Offset (UTC_Hour, -8)); Display_1.Set_Digit (1, (PST_Hour / 10) mod 10); Display_1.Set_Digit (2, PST_Hour mod 10); Display_1.Set_Digit (3, (Minute / 10) mod 10); Display_1.Set_Digit (4, Minute mod 10); Display_2.Set_Digit (1, (EST_Hour / 10) mod 10); Display_2.Set_Digit (2, EST_Hour mod 10); Display_2.Set_Digit (3, (Minute / 10) mod 10); Display_2.Set_Digit (4, Minute mod 10); Display_3.Set_Digit (1, (UTC_Hour / 10) mod 10); Display_3.Set_Digit (2, UTC_Hour mod 10); Display_3.Set_Digit (3, (Minute / 10) mod 10); Display_3.Set_Digit (4, Minute mod 10); Display_1.Update; Display_2.Update; Display_3.Update; end Update; end Clock;
AdaCore/gpr
Ada
3,766
adb
-- -- Copyright (C) 2019-2023, AdaCore -- -- SPDX-License-Identifier: Apache-2.0 -- with Ada.Strings.Fixed; with Ada.Text_IO; with GPR2.Unit; with GPR2.Context; with GPR2.Path_Name; with GPR2.Project.Source.Set; with GPR2.Project.View; with GPR2.Project.Tree; with GPR2.Source_Info.Parser.Ada_Language; procedure Main is use Ada; use GPR2; use GPR2.Project; procedure Check (Project_Name : Filename_Type); -- Do check the given project's sources procedure Output_Filename (Filename : Path_Name.Full_Name); -- Remove the leading tmp directory ----------- -- Check -- ----------- procedure Check (Project_Name : Filename_Type) is procedure List_Sources (View : Project.View.Object); ------------------ -- List_Sources -- ------------------ procedure List_Sources (View : Project.View.Object) is begin Text_IO.New_Line; Text_IO.Put_Line ("---------- ALL"); for Source of View.Sources loop declare U : constant Optional_Name_Type := Source.Unit_Name; begin Output_Filename (Source.Path_Name.Value); Text_IO.Set_Col (20); Text_IO.Put (" language: " & Image (Source.Language)); Text_IO.Set_Col (36); Text_IO.Put (" Kind: " & GPR2.Unit.Library_Unit_Type'Image (Source.Kind)); if U /= "" then Text_IO.Set_Col (60); Text_IO.Put ("unit: " & String (U)); end if; Text_IO.New_Line; end; end loop; Text_IO.New_Line; Text_IO.Put_Line ("---------- INTERFACE ONLY"); for Source of View.Sources (Interface_Only => True) loop declare U : constant Optional_Name_Type := Source.Unit_Name; begin Output_Filename (Source.Path_Name.Value); Text_IO.Set_Col (20); Text_IO.Put (" Kind: " & GPR2.Unit.Library_Unit_Type'Image (Source.Kind)); if U /= "" then Text_IO.Set_Col (60); Text_IO.Put ("unit: " & String (U)); end if; Text_IO.New_Line; end; end loop; Text_IO.New_Line; Text_IO.Put_Line ("---------- COMPILABLE ONLY"); for Source of View.Sources (Compilable_Only => True) loop declare U : constant Optional_Name_Type := Source.Unit_Name; begin Output_Filename (Source.Path_Name.Value); Text_IO.Set_Col (20); Text_IO.Put (" Kind: " & GPR2.Unit.Library_Unit_Type'Image (Source.Kind)); if U /= "" then Text_IO.Set_Col (60); Text_IO.Put ("unit: " & String (U)); end if; Text_IO.New_Line; end; end loop; end List_Sources; Prj : Project.Tree.Object; Ctx : Context.Object; View : Project.View.Object; begin Project.Tree.Load (Prj, Create (Project_Name), Ctx); View := Prj.Root_Project; Text_IO.Put_Line ("Project: " & String (View.Name)); List_Sources (View); end Check; --------------------- -- Output_Filename -- --------------------- procedure Output_Filename (Filename : Path_Name.Full_Name) is I : constant Positive := Strings.Fixed.Index (Filename, "source-library-interface"); begin Text_IO.Put (" > " & Filename (I + 25 .. Filename'Last)); end Output_Filename; begin Check ("demo.gpr"); end Main;
rogermc2/GA_Ada
Ada
12,940
adb
with Ada.Strings.Unbounded; with Ada.Text_IO; use Ada.Text_IO; with Utilities; package body GA_Utilities is function Multivector_Size (MV : Multivectors.Multivector) return Integer is theBlades : constant Blade.Blade_List := Multivectors.Blades (MV); begin return Integer (theBlades.Length); end Multivector_Size; -- ------------------------------------------------------------------------ procedure Print_Bitmap (Name : String; Bitmap : Interfaces.Unsigned_32) is use Interfaces; BM : Unsigned_32 := Bitmap; Bit_String : String (1 .. 32) := (others => '0'); begin New_Line; Put_Line (Name & " Bitmap:"); for index in 1 .. 32 loop if (BM and 1) /= 0 then Bit_String (33 - index) := '1'; end if; BM := BM / 2; end loop; Put_Line (Bit_String); end Print_Bitmap; -- ------------------------------------------------------------------------ procedure Print_Blade (Name : String; B : Blade.Basis_Blade) is begin New_Line; Put_Line (Name); Put_Line (" Bitmap and Weight:"); Put_Line (Interfaces.Unsigned_32'Image (Blade.Bitmap (B)) & " " & Float'Image (Blade.Weight (B))); New_Line; end Print_Blade; -- ------------------------------------------------------------------------ procedure Print_Blade_List (Name : String; BL : Blade.Blade_List) is use Blade; use Blade_List_Package; aBlade : Basis_Blade; Curs : Cursor := BL.First; begin New_Line; Put_Line (Name); Put_Line ("Blades, Bitmap and Weight:"); while Has_Element (Curs) loop aBlade := Element (Curs); Put_Line (Interfaces.Unsigned_32'Image (Bitmap (aBlade)) & " " & Float'Image (Weight (aBlade))); Next (Curs); end loop; New_Line; exception when others => Put_Line ("An exception occurred in GA_Utilities.Print_Blade_List."); raise; end Print_Blade_List; -- ------------------------------------------------------------------------ procedure Print_Blade_String (Name : String; B : Blade.Basis_Blade; MV_Names : Blade_Types.Basis_Vector_Names) is use Ada.Strings.Unbounded; use Multivectors; MV : constant Multivector := New_Multivector (B); begin Put_Line (Name & ":"); Put_Line (To_String (Multivector_String (MV, MV_Names))); end Print_Blade_String; -- ------------------------------------------------------------------------ procedure Print_Blade_String_Array (Name : String; BB_Array : Blade.Basis_Blade_Array; MV_Names : Blade_Types.Basis_Vector_Names) is begin for index in BB_Array'Range loop GA_Utilities.Print_Blade_String (Name, BB_Array (index), MV_Names); end loop; end Print_Blade_String_Array; -- ------------------------------------------------------------------------ procedure Print_E3_Vector (Name : String; aVector : E3GA.E3_Vector) is begin Utilities.Print_Vector (Name, aVector); end Print_E3_Vector; -- ------------------------------------------------------------------------ procedure Print_E3_Vector_Array (Name : String; anArray : GL.Types.Singles.Vector3_Array) is use GL.Types; begin Put_Line (Name & ": "); for Index in anArray'First .. anArray'Last loop Put (Int'Image (Index) & ": "); Print_E3_Vector (Name, anArray (Index)); if Index mod 10 = 0 then New_Line; end if; end loop; New_Line; end Print_E3_Vector_Array; -- ------------------------------------------------------------------------ procedure Print_Float_3D (Name : String; aVector : GA_Maths.Float_3D) is begin if Name = "" then Put (" "); else Put (Name & ": "); end if; for Index in aVector'Range loop Put (Float'Image (aVector (Index)) & " "); end loop; New_Line; end Print_Float_3D; -- ------------------------------------------------------------------------ procedure Print_Float_Array (Name : String; anArray : GA_Maths.Float_Vector) is begin Put_Line (Name & ": "); for Index in anArray'First .. anArray'Last loop Put (Float'Image (anArray (Index)) & " "); if Index mod 6 = 0 then New_Line; end if; end loop; New_Line; end Print_Float_Array; -- ------------------------------------------------------------------------ procedure Print_Integer_Array (Name : String; anArray : GA_Maths.Integer_Array) is begin Put_Line (Name & ": "); for Index in anArray'First .. anArray'Last loop Put (Integer'Image (anArray (Index)) & " "); if Index mod 3 = 0 then New_Line; end if; end loop; New_Line; end Print_Integer_Array; -- ------------------------------------------------------------------------ procedure Print_Matrix (Name : String; aMatrix : GA_Maths.GA_Matrix3) is begin Put_Line (Name & ":"); for Row in 1 .. 3 loop for Column in 1 .. 3 loop Put (float'Image (aMatrix (Row, Column)) & " "); end loop; New_Line; end loop; New_Line; end Print_Matrix; -- ------------------------------------------------------------------------ procedure Print_Matrix (Name : String; aMatrix : Real_Matrix) is use GA_Maths; begin if Name /= "" then Put_Line (Name & ":"); end if; Put_Line ("Size:" & Integer'Image (aMatrix'Length) & " X" & Integer'Image (aMatrix'Length (2))); for Row in aMatrix'Range (1) loop for Column in aMatrix'Range (2) loop Put (Float_3'Image (Float_3 (aMatrix (Row, Column))) & " "); end loop; New_Line; end loop; New_Line; end Print_Matrix; -- ------------------------------------------------------------------------ procedure Print_Matrix (Name : String; aMatrix : Real_Matrix; Start, Last : GA_Maths.Array_I2) is use GA_Maths; L_Row : constant Integer := Minimum (aMatrix'Length(1), Last (1)); L_Col : constant Integer := Minimum (aMatrix'Length(2), Last (2)); begin if Name /= "" then Put_Line (Name & ":"); end if; Put_Line ("Size:" & Integer'Image (aMatrix'Length (1)) & " X" & Integer'Image (aMatrix'Length (2))); Put ("Rows:" & Integer'Image (Start (1)) & " .." & Integer'Image (L_Row)); Put_Line (" Columns:" & Integer'Image (Start (2)) & " .." & Integer'Image (L_Col)); for Row in Start (1) .. L_Row loop for Column in Start (2) .. L_Col loop Put (Float_3'Image (Float_3 (aMatrix (Row, Column))) & " "); end loop; New_Line; end loop; New_Line; end Print_Matrix; -- ------------------------------------------------------------------------ procedure Print_Metric (Name : String; aMetric : Metric.Metric_Record) is use Metric; Dim : constant Integer := aMetric.Dim; begin New_Line; Put_Line (Name); Put_Line ("Dimension: " & Integer'Image (Dim)); Print_Matrix ("", Real_Matrix ((Matrix (aMetric)))); Put_Line ("Is_Diagonal: " & Boolean'Image (Is_Diagonal (aMetric))); Put_Line ("Is_Euclidean: " & Boolean'Image (Is_Euclidean (aMetric))); Put_Line ("Is_Anti_Euclidean: " & Boolean'Image (Is_Anti_Euclidean (aMetric))); New_Line; end Print_Metric; -- ------------------------------------------------------------------------ procedure Print_Multivector (Name : String; MV : Multivectors.Multivector) is use Blade; use Multivectors; use Blade_List_Package; theBlades : constant Blade_List := Blades (MV); aBlade : Blade.Basis_Blade; Curs : Cursor := theBlades.First; begin if Name /= "" then Put_Line (Name); end if; Put_Line ("MV Type: " & MV_Type'Image (MV_Kind (MV))); Put_Line ("MV Size: " & Integer'Image (Multivector_Size (MV))); Put_Line ("Grade Use Bitmap: " & GA_Maths.Grade_Usage'Image (Grade_Use (MV))); Put_Line ("Multivector Blades, Bitmap and Weight:"); while Has_Element (Curs) loop aBlade := Element (Curs); Put_Line (Interfaces.Unsigned_32'Image (Blade.Bitmap (aBlade)) & " " & Float'Image (Blade.Weight (aBlade))); Next (Curs); end loop; New_Line; exception when others => Put_Line ("An exception occurred in GA_Utilities.Print_Multivector."); raise; end Print_Multivector; -- ------------------------------------------------------------------------ procedure Print_Multivector_Info (Name : String; Info : Multivector_Type.MV_Type_Record) is use Multivector_Type; begin Put_Line (Name); Put_Line ("Zero " & boolean'Image (Zero (Info))); Put_Line ("MV Type " & MV_Type'Image (MV_Kind (Info))); Put_Line ("Grade " & Integer'Image (MV_Grade (Info))); Put_Line ("Grade use " & Interfaces.Unsigned_32'Image (Grade_Use (Info))); Put_Line ("Parity " & Parity_Type'Image (Parity (Info))); exception when others => Put_Line ("An exception occurred in GA_Utilities.Print_Multivector_Info."); raise; end Print_Multivector_Info; -- ------------------------------------------------------------------------ procedure Print_Multivector_List (Name : String; MV_List : Multivectors.Multivector_List) is use Multivectors; MV_List_Length : constant Integer := List_Length (MV_List); MV : Multivector; begin New_Line; if MV_List_Length < 1 then Put_Line (Name & " is empty."); else Put_Line (Name & ":"); for index in 1 .. MV_List_Length loop MV := Get_Multivector (MV_List, index); Print_Multivector ("", MV); end loop; end if; exception when others => Put_Line ("An exception occurred in GA_Utilities.Print_Multivector_List."); raise; end Print_Multivector_List; -- ------------------------------------------------------------------------ procedure Print_Multivector_List_String (Name : String; MV_List : Multivectors.Multivector_List; MV_Names : Blade_Types.Basis_Vector_Names) is use Multivectors; MV_List_Length : constant Integer := List_Length (MV_List); MV : Multivector; begin New_Line; if MV_List_Length < 1 then Put_Line (Name & " is empty."); else Put_Line (Name & ", List Length" & Integer'Image (MV_List_Length) & ":"); for index in 1 .. MV_List_Length loop MV := Get_Multivector (MV_List, index); Print_Multivector_String ("", MV, MV_Names); end loop; end if; exception when others => Put_Line ("An exception occurred in GA_Utilities.Print_Multivector_List_String."); raise; end Print_Multivector_List_String; -- ------------------------------------------------------------------------ procedure Print_Multivector_String (Name : String; MV : Multivectors.Multivector; MV_Names : Blade_Types.Basis_Vector_Names) is use Ada.Strings.Unbounded; begin if Name /= "" then Put (Name & ": "); end if; Put_Line (To_String (Multivectors.Multivector_String (MV, MV_Names))); exception when others => Put_Line ("An exception occurred in GA_Utilities.Print_Multivector_String."); raise; end Print_Multivector_String; -- ------------------------------------------------------------------------ procedure Print_Vertex (Name : String; Vertex : Multivectors.M_Vector) is use Blade; use Multivectors; use Blade_List_Package; theBlades : constant Blade_List := Blades (Vertex); aBlade : Blade.Basis_Blade; Curs : Cursor := theBlades.First; begin Put (Name & ": "); while Has_Element (Curs) loop aBlade := Element (Curs); Put (Float'Image (Blade.Weight (aBlade)) & " "); Next (Curs); end loop; New_Line; exception when others => Put_Line ("An exception occurred in GA_Utilities.Print_Vertex."); raise; end Print_Vertex; -- ------------------------------------------------------------------------ end GA_Utilities;
vpodzime/ada-util
Ada
1,154
ads
----------------------------------------------------------------------- -- Util-strings-builders -- Set of strings -- Copyright (C) 2013 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Texts.Builders; -- The <b>Util.Strings.Builders</b> package provides an instantiation -- of a text builders for <tt>Character</tt> and <tt>String</tt> types. package Util.Strings.Builders is new Util.Texts.Builders (Element_Type => Character, Input => String);
reznikmm/matreshka
Ada
4,592
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Chart.Maximum_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Chart_Maximum_Attribute_Node is begin return Self : Chart_Maximum_Attribute_Node do Matreshka.ODF_Chart.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Chart_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Chart_Maximum_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Maximum_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Chart_URI, Matreshka.ODF_String_Constants.Maximum_Attribute, Chart_Maximum_Attribute_Node'Tag); end Matreshka.ODF_Chart.Maximum_Attributes;
reznikmm/matreshka
Ada
3,600
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Elements.Generic_Hash; function AMF.CMOF.Elements.Hash is new AMF.Elements.Generic_Hash (CMOF_Element, CMOF_Element_Access);
reznikmm/matreshka
Ada
4,567
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Form.Value_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Form_Value_Attribute_Node is begin return Self : Form_Value_Attribute_Node do Matreshka.ODF_Form.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Form_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Form_Value_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Value_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Form_URI, Matreshka.ODF_String_Constants.Value_Attribute, Form_Value_Attribute_Node'Tag); end Matreshka.ODF_Form.Value_Attributes;
stcarrez/ada-rest-api-server-benchmark
Ada
3,150
adb
-- -- -- procedure Test_HTTP_Server Copyright (c) Dmitry A. Kazakov -- -- HTTP server test Luebeck -- -- Winter, 2013 -- -- -- -- Last revision : 08:20 11 Jan 2015 -- -- -- -- This library is free software; you can redistribute it and/or -- -- modify it under the terms of the GNU General Public License as -- -- published by the Free Software Foundation; either version 2 of -- -- the License, or (at your option) any later version. This library -- -- is distributed in the hope that it will be useful, but WITHOUT -- -- ANY WARRANTY; without even the implied warranty of -- -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU -- -- General Public License for more details. You should have -- -- received a copy of the GNU General Public License along with -- -- this library; if not, write to the Free Software Foundation, -- -- Inc., 59 Temple Place - Suite 330, Boston, MA 02111-1307, USA. -- -- -- -- As a special exception, if other files instantiate generics from -- -- this unit, or you link this unit with other files to produce an -- -- executable, this unit does not by itself cause the resulting -- -- executable to be covered by the GNU General Public License. This -- -- exception does not however invalidate any other reasons why the -- -- executable file might be covered by the GNU Public License. -- -- ___________________________________________________________________-- with Ada.Exceptions; use Ada.Exceptions; with Ada.Text_IO; use Ada.Text_IO; -- with GNAT.Exception_Traces; use GNAT.Exception_Traces; with Rest_Api_Servers; use Rest_Api_Servers; with GNAT.Sockets.Server.Pooled; procedure Components_Rest_Api is Minutes : constant := 3.0; -- * 60.0 * 24.0 * 10.0; Port : constant := 8080; Tasks : constant := 5; begin -- Trace_On (Every_Raise); declare Factory : aliased Api_HTTP_Factory (Request_Length => 200, Input_Size => 1024, Output_Size => 1024, Max_Connections => 100 ); Server : GNAT.Sockets.Server.Pooled.Pooled_Server (Factory'Access, Port, Tasks); begin -- Trace_On -- ( Factory => Factory, -- Received => GNAT.Sockets.Server.Trace_Decoded, -- Sent => GNAT.Sockets.Server.Trace_Decoded -- ); Put_Line ("HTTP server started"); delay 60.0 * Minutes; -- Service Put_Line ("HTTP server stopping"); end; exception when Error : others => Put_Line ("Error: " & Exception_Information (Error)); end Components_Rest_Api;
ZinebZaad/ENSEEIHT
Ada
1,342
adb
with Ada.Text_IO; use Ada.Text_IO; with Ada.Unchecked_Deallocation; package body LC is procedure Free is new Ada.Unchecked_Deallocation (Object => T_Cellule, Name => T_LC); procedure Initialiser(Sda: out T_LC) is begin Sda := null; end Initialiser; function Est_Vide (Sda : T_LC) return Boolean is begin return Sda = null; end Est_Vide; function Taille (Sda : in T_LC) return Integer is Taille: Integer; Temp: T_LC; begin Taille := 0; Temp := Sda; while not Est_Vide(Temp) loop Taille := Taille + 1; Temp := Temp.all.Suivant; end loop; return Taille; end Taille; procedure Ajouter (Sda : in out T_LC ; Cle : in T_Cle ; Donnee : in T_Donnee) is Temp: T_LC; begin Temp := Sda; Sda := new T_Cellule; Sda.all.Cle := Cle; Sda.all.Donnee := Donnee; Sda.all.Suivant := Temp; end Ajouter; procedure Vider (Sda : in out T_LC) is Temp: T_LC; begin while not Est_Vide(Sda) loop Temp := Sda; Sda := Sda.all.Suivant; Free(Temp); end loop; end Vider; procedure Pour_Chaque (Sda : in T_LC) is Temp: T_LC; begin Temp := Sda; while not Est_Vide(Temp) loop begin Traiter(Temp.all.Cle, Temp.all.Donnee); exception when others => null; end; Temp := Temp.all.Suivant; end loop; end Pour_Chaque; end LC;
AdaCore/libadalang
Ada
497
adb
with System.Storage_Elements; procedure Test is X : System.Address := System'To_Address (2); pragma Test_Statement_UID; generic type Param_Type is private; type Return_Type is private; with function Foo (X : Param_Type) return Return_Type; package Pkg_G is end Pkg_G; package My_Pkg_To_Address is new Pkg_G (System.Storage_Elements.Integer_Address, System.Address, System'To_Address); pragma Test_Statement_UID; begin null; end Test;
SayCV/rtems-addon-packages
Ada
6,667
adb
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding Samples -- -- -- -- ncurses -- -- -- -- B O D Y -- -- -- ------------------------------------------------------------------------------ -- Copyright (c) 2000-2006,2011 Free Software Foundation, Inc. -- -- -- -- Permission is hereby granted, free of charge, to any person obtaining a -- -- copy of this software and associated documentation files (the -- -- "Software"), to deal in the Software without restriction, including -- -- without limitation the rights to use, copy, modify, merge, publish, -- -- distribute, distribute with modifications, sublicense, and/or sell -- -- copies of the Software, and to permit persons to whom the Software is -- -- furnished to do so, subject to the following conditions: -- -- -- -- The above copyright notice and this permission notice shall be included -- -- in all copies or substantial portions of the Software. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS -- -- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF -- -- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. -- -- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, -- -- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR -- -- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR -- -- THE USE OR OTHER DEALINGS IN THE SOFTWARE. -- -- -- -- Except as contained in this notice, the name(s) of the above copyright -- -- holders shall not be used in advertising or otherwise to promote the -- -- sale, use or other dealings in this Software without prior written -- -- authorization. -- ------------------------------------------------------------------------------ -- Author: Eugene V. Melaragno <[email protected]> 2000 -- Version Control -- $Revision$ -- $Date$ -- Binding Version 01.00 ------------------------------------------------------------------------------ with ncurses2.util; use ncurses2.util; with Terminal_Interface.Curses; use Terminal_Interface.Curses; with Terminal_Interface.Curses.Menus; use Terminal_Interface.Curses.Menus; with Terminal_Interface.Curses.Mouse; use Terminal_Interface.Curses.Mouse; procedure ncurses2.menu_test is function menu_virtualize (c : Key_Code) return Key_Code; procedure xAdd (l : Line_Position; c : Column_Position; s : String); function menu_virtualize (c : Key_Code) return Key_Code is begin case c is when Character'Pos (newl) | Key_Exit => return Menu_Request_Code'Last + 1; -- MAX_COMMAND? TODO when Character'Pos ('u') => return M_ScrollUp_Line; when Character'Pos ('d') => return M_ScrollDown_Line; when Character'Pos ('b') | Key_Next_Page => return M_ScrollUp_Page; when Character'Pos ('f') | Key_Previous_Page => return M_ScrollDown_Page; when Character'Pos ('n') | Key_Cursor_Down => return M_Next_Item; when Character'Pos ('p') | Key_Cursor_Up => return M_Previous_Item; when Character'Pos (' ') => return M_Toggle_Item; when Key_Mouse => return c; when others => Beep; return c; end case; end menu_virtualize; MENU_Y : constant Line_Count := 8; MENU_X : constant Column_Count := 8; type String_Access is access String; animals : constant array (Positive range <>) of String_Access := (new String'("Lions"), new String'("Tigers"), new String'("Bears"), new String'("(Oh my!)"), new String'("Newts"), new String'("Platypi"), new String'("Lemurs")); items_a : constant Item_Array_Access := new Item_Array (1 .. animals'Last + 1); tmp : Event_Mask; procedure xAdd (l : Line_Position; c : Column_Position; s : String) is begin Add (Line => l, Column => c, Str => s); end xAdd; mrows : Line_Count; mcols : Column_Count; menuwin : Window; m : Menu; c1 : Key_Code; c : Driver_Result; r : Key_Code; begin tmp := Start_Mouse; xAdd (0, 0, "This is the menu test:"); xAdd (2, 0, " Use up and down arrow to move the select bar."); xAdd (3, 0, " 'n' and 'p' act like arrows."); xAdd (4, 0, " 'b' and 'f' scroll up/down (page), 'u' and 'd' (line)."); xAdd (5, 0, " Press return to exit."); Refresh; for i in animals'Range loop items_a.all (i) := New_Item (animals (i).all); end loop; items_a.all (animals'Last + 1) := Null_Item; m := New_Menu (items_a); Set_Format (m, Line_Position (animals'Last + 1) / 2, 1); Scale (m, mrows, mcols); menuwin := Create (mrows + 2, mcols + 2, MENU_Y, MENU_X); Set_Window (m, menuwin); Set_KeyPad_Mode (menuwin, True); Box (menuwin); -- 0,0? Set_Sub_Window (m, Derived_Window (menuwin, mrows, mcols, 1, 1)); Post (m); loop c1 := Getchar (menuwin); r := menu_virtualize (c1); c := Driver (m, r); exit when c = Unknown_Request; -- E_UNKNOWN_COMMAND? if c = Request_Denied then Beep; end if; -- continue ? end loop; Move_Cursor (Line => Lines - 2, Column => 0); Add (Str => "You chose: "); Add (Str => Name (Current (m))); Add (Ch => newl); Pause; -- the C version didn't use Pause, it spelled it out Post (m, False); -- unpost, not clear :-( declare begin Delete (menuwin); exception when Curses_Exception => null; end; -- menuwin has children so will raise the exception. Delete (m); End_Mouse (tmp); end ncurses2.menu_test;
stcarrez/ada-keystore
Ada
27,407
adb
----------------------------------------------------------------------- -- keystore-repository -- Repository management for the keystore -- Copyright (C) 2019, 2020 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Log.Loggers; with Util.Strings; with Ada.Unchecked_Deallocation; with Keystore.Marshallers; with Keystore.Repository.Data; with Keystore.Repository.Entries; with Keystore.Repository.Workers; with Keystore.Repository.Keys; -- Block = 4K, 8K, 16K, 64K, 128K ? -- -- Block types: -- * Wallet File First Block -- * Wallet Header -- * Wallet Repository -- * Wallet Data -- -- Generic Block header -- +------------------+ -- | Block HMAC-256 | 32b -- +------------------+ -- | Block type | 4b -- | Wallet id | 4b -- | PAD 0 | 4b -- | PAD 0 | 4b -- +------------------+ -- | ...AES-CTR... | B -- +------------------+ package body Keystore.Repository is use type Interfaces.Unsigned_64; Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("Keystore.Repository"); procedure Free is new Ada.Unchecked_Deallocation (Object => Wallet_Entry, Name => Wallet_Entry_Access); procedure Free is new Ada.Unchecked_Deallocation (Object => Wallet_Directory_Entry, Name => Wallet_Directory_Entry_Access); procedure Free is new Ada.Unchecked_Deallocation (Object => Keystore.Repository.Workers.Wallet_Worker, Name => Wallet_Worker_Access); procedure Mkdir (Repository : in out Wallet_Repository; Name : in String); function Hash (Value : in Wallet_Entry_Index) return Ada.Containers.Hash_Type is begin return Ada.Containers.Hash_Type (Value); end Hash; function Get_Identifier (Repository : in Wallet_Repository) return Wallet_Identifier is begin return Repository.Id; end Get_Identifier; procedure Open (Repository : in out Wallet_Repository; Config : in Keystore.Wallet_Config; Ident : in Wallet_Identifier; Stream : in IO.Wallet_Stream_Access) is begin Repository.Id := Ident; Repository.Stream := Stream; Repository.Next_Id := 1; Repository.Next_Wallet_Id := Ident + 1; Repository.Config.Randomize := Config.Randomize; Repository.Config.Cache_Directory := Config.Cache_Directory; end Open; procedure Open (Repository : in out Wallet_Repository; Name : in String; Password : in out Keystore.Passwords.Provider'Class; Keys : in out Keystore.Keys.Key_Manager; Master_Block : in out Keystore.IO.Storage_Block; Master_Ident : in out Wallet_Identifier; Wallet : in out Wallet_Repository) is Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); begin if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Wallet entry '{0}' not found", Name); raise Not_Found; end if; declare Item : constant Wallet_Entry_Access := Wallet_Maps.Element (Pos); begin if Item.Kind /= T_WALLET then raise Invalid_Keystore; end if; Master_Block := Repository.Root; Master_Block.Block := Item.Master; Master_Ident := Item.Wallet_Id; Wallet.Stream := Repository.Stream; Wallet.Next_Id := 1; Wallet.Id := Item.Wallet_Id; Wallet.Parent := Repository'Unchecked_Access; Keystore.Repository.Keys.Open_Wallet (Repository, Item, Keys); Keystore.Keys.Open (Keys, Password, Wallet.Id, Master_Block, Wallet.Root, Wallet.Config, null, Repository.Stream.all); Wallet.Workers := Workers.Create (Wallet'Unchecked_Access, null, 1).all'Access; Entries.Load_Complete_Directory (Wallet, Wallet.Root); end; end Open; procedure Create (Repository : in out Wallet_Repository; Password : in out Keystore.Passwords.Provider'Class; Config : in Wallet_Config; Block : in IO.Storage_Block; Ident : in Wallet_Identifier; Keys : in out Keystore.Keys.Key_Manager; Stream : in IO.Wallet_Stream_Access) is Entry_Block : Wallet_Directory_Entry_Access; begin Stream.Allocate (IO.DIRECTORY_BLOCK, Repository.Root); Repository.Id := Ident; Repository.Next_Id := 1; Repository.Next_Wallet_Id := Ident + 1; Repository.Stream := Stream; Repository.Config.Randomize := Config.Randomize; Repository.Config.Cache_Directory := Config.Cache_Directory; Repository.Config.Max_Counter := Interfaces.Unsigned_32 (Config.Max_Counter); Repository.Config.Min_Counter := Interfaces.Unsigned_32 (Config.Min_Counter); Keystore.Keys.Create (Keys, Password, 1, Ident, Block, Repository.Root, Repository.Config, Stream.all); Repository.Workers := Workers.Create (Repository'Unchecked_Access, null, 1).all'Access; -- We need a new wallet directory block. Entries.Initialize_Directory_Block (Repository, Repository.Root, 0, Entry_Block); Repository.Current.Buffer := Buffers.Allocate (Repository.Root); -- Fill the root directory block with random values or with zeros. if Repository.Config.Randomize then Repository.Random.Generate (Repository.Current.Buffer.Data.Value.Data); else Repository.Current.Buffer.Data.Value.Data := (others => 0); end if; Marshallers.Set_Header (Into => Repository.Current, Tag => IO.BT_WALLET_DIRECTORY, Id => Repository.Id); Marshallers.Put_Unsigned_32 (Repository.Current, 0); Marshallers.Put_Block_Index (Repository.Current, IO.Block_Index'Last); Marshallers.Put_Unsigned_32 (Repository.Current, 0); Keystore.Keys.Set_IV (Repository.Config.Dir, Repository.Root.Block); Stream.Write (From => Repository.Current.Buffer, Cipher => Repository.Config.Dir.Cipher, Sign => Repository.Config.Dir.Sign); end Create; procedure Unlock (Repository : in out Wallet_Repository; Password : in out Keystore.Passwords.Provider'Class; Block : in Keystore.IO.Storage_Block; Keys : in out Keystore.Keys.Key_Manager) is begin Keystore.Keys.Open (Keys, Password, Repository.Id, Block, Repository.Root, Repository.Config, null, Repository.Stream.all); Repository.Workers := Workers.Create (Repository'Unchecked_Access, null, 1).all'Access; Entries.Load_Complete_Directory (Repository, Repository.Root); end Unlock; procedure Mkdir (Repository : in out Wallet_Repository; Name : in String) is First : Positive := Name'First; Pos : Natural; begin while First <= Name'Last loop Pos := Util.Strings.Index (Name, '/', First); if Pos = 0 then Pos := Name'Last; else Pos := Pos - 1; end if; declare Path : constant String := Name (Name'First .. Pos); Item : Wallet_Entry_Access; begin if not Repository.Map.Contains (Path) then Log.Info ("Mkdir {0}", Path); Entries.Add_Entry (Repository, Path, T_DIRECTORY, Item); Entries.Update_Entry (Repository, Item, T_DIRECTORY, 0); end if; end; First := Pos + 2; end loop; end Mkdir; procedure Add (Repository : in out Wallet_Repository; Name : in String; Kind : in Entry_Type; Content : in Ada.Streams.Stream_Element_Array) is Item : Wallet_Entry_Access; Data_Offset : Interfaces.Unsigned_64 := 0; Iterator : Keys.Data_Key_Iterator; Pos : Natural; begin -- For a new file, make sure we have a T_DIRECTORY entry for each path component. if Kind = T_FILE then Pos := Util.Strings.Rindex (Name, '/'); if Pos > 0 then Mkdir (Repository, Name (Name'First .. Pos - 1)); end if; end if; Entries.Add_Entry (Repository, Name, Kind, Item); Entries.Update_Entry (Repository, Item, Kind, Content'Length); if Content'Length > 0 then Keys.Initialize (Repository, Iterator, Item); Data.Add_Data (Repository, Iterator, Content, Data_Offset); Entries.Update_Entry (Repository, Item, Kind, Data_Offset); end if; Entries.Save (Manager => Repository); end Add; procedure Add (Repository : in out Wallet_Repository; Name : in String; Kind : in Entry_Type; Input : in out Util.Streams.Input_Stream'Class) is Item : Wallet_Entry_Access; Data_Offset : Interfaces.Unsigned_64 := 0; Iterator : Keys.Data_Key_Iterator; Pos : Natural; begin -- For a new file, make sure we have a T_DIRECTORY entry for each path component. if Kind = T_FILE then Pos := Util.Strings.Rindex (Name, '/'); if Pos > 0 then Mkdir (Repository, Name (Name'First .. Pos - 1)); end if; end if; Entries.Add_Entry (Repository, Name, Kind, Item); Entries.Update_Entry (Repository, Item, Kind, 1); Keys.Initialize (Repository, Iterator, Item); Data.Add_Data (Repository, Iterator, Input, Data_Offset); Entries.Update_Entry (Repository, Item, Kind, Data_Offset); Entries.Save (Manager => Repository); end Add; procedure Add_Wallet (Repository : in out Wallet_Repository; Name : in String; Password : in out Keystore.Passwords.Provider'Class; Keys : in out Keystore.Keys.Key_Manager; Master_Block : in out Keystore.IO.Storage_Block; Master_Ident : in out Wallet_Identifier; Wallet : in out Wallet_Repository) is Item : Wallet_Entry_Access; Entry_Block : Wallet_Directory_Entry_Access; begin Entries.Add_Entry (Repository, Name, T_WALLET, Item); -- Repository.Value.Add (Name, Password, Wallet, Stream); Repository.Stream.Allocate (IO.MASTER_BLOCK, Master_Block); Repository.Stream.Allocate (IO.DIRECTORY_BLOCK, Wallet.Root); Item.Master := Master_Block.Block; Wallet.Stream := Repository.Stream; Wallet.Next_Id := 1; Wallet.Id := Item.Wallet_Id; Master_Ident := Wallet.Id; Entries.Update_Entry (Repository, Item, T_WALLET, 0); Keystore.Repository.Keys.Create_Wallet (Repository, Item, Master_Block, Keys); Keystore.Keys.Create (Keys, Password, 1, Master_Ident, Master_Block, Wallet.Root, Wallet.Config, Repository.Stream.all); -- We need a new wallet directory block. Entries.Initialize_Directory_Block (Wallet, Wallet.Root, 0, Entry_Block); Entries.Save (Repository); Wallet.Current.Buffer := Buffers.Allocate (Wallet.Root); Wallet.Current.Buffer.Data.Value.Data := (others => 0); Marshallers.Set_Header (Into => Wallet.Current, Tag => IO.BT_WALLET_DIRECTORY, Id => Wallet.Id); Marshallers.Put_Unsigned_32 (Wallet.Current, 0); Marshallers.Put_Block_Index (Wallet.Current, IO.Block_Index'Last); Keystore.Keys.Set_IV (Wallet.Config.Dir, Wallet.Root.Block); Repository.Stream.Write (From => Wallet.Current.Buffer, Cipher => Wallet.Config.Dir.Cipher, Sign => Wallet.Config.Dir.Sign); Wallet.Workers := Workers.Create (Wallet'Unchecked_Access, null, 1).all'Access; end Add_Wallet; procedure Set (Repository : in out Wallet_Repository; Name : in String; Kind : in Entry_Type; Content : in Ada.Streams.Stream_Element_Array) is begin if Repository.Map.Contains (Name) then Repository.Update (Name, Kind, Content); else Repository.Add (Name, Kind, Content); end if; end Set; procedure Set (Repository : in out Wallet_Repository; Name : in String; Kind : in Entry_Type; Input : in out Util.Streams.Input_Stream'Class) is begin if Repository.Map.Contains (Name) then Repository.Update (Name, Kind, Input); else Repository.Add (Name, Kind, Input); end if; end Set; procedure Update (Repository : in out Wallet_Repository; Name : in String; Kind : in Entry_Type; Content : in Ada.Streams.Stream_Element_Array) is Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); Data_Offset : Interfaces.Unsigned_64 := 0; begin Log.Debug ("Update keystore entry {0}", Name); if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; declare Item : constant Wallet_Entry_Access := Wallet_Maps.Element (Pos); Iterator : Keys.Data_Key_Iterator; Last_Pos : Stream_Element_Offset; begin if Item.Is_Wallet then Log.Info ("Data entry '{0}' is a wallet", Name); raise No_Content; end if; Item.Kind := Kind; Keys.Initialize (Repository, Iterator, Item); if Content'Length > 0 then Data.Update_Data (Repository, Iterator, Content, Last_Pos, Data_Offset); else Last_Pos := Content'Last + 1; end if; if Last_Pos > Content'Last then Data.Delete_Data (Repository, Iterator); else Data.Add_Data (Repository, Iterator, Content (Last_Pos .. Content'Last), Data_Offset); end if; Entries.Update_Entry (Repository, Item, Kind, Data_Offset); Entries.Save (Repository); end; end Update; procedure Update (Repository : in out Wallet_Repository; Name : in String; Kind : in Entry_Type; Input : in out Util.Streams.Input_Stream'Class) is Item_Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); Data_Offset : Interfaces.Unsigned_64 := 0; begin Log.Debug ("Update keystore entry {0}", Name); if not Wallet_Maps.Has_Element (Item_Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; declare Item : constant Wallet_Entry_Access := Wallet_Maps.Element (Item_Pos); Iterator : Keys.Data_Key_Iterator; End_Of_Stream : Boolean; begin if Item.Is_Wallet then Log.Info ("Data entry '{0}' is a wallet", Name); raise No_Content; end if; Item.Kind := Kind; Keys.Initialize (Repository, Iterator, Item); Data.Update_Data (Repository, Iterator, Input, End_Of_Stream, Data_Offset); if not End_Of_Stream then Data.Add_Data (Repository, Iterator, Input, Data_Offset); end if; Entries.Update_Entry (Repository, Item, Kind, Data_Offset); Entries.Save (Repository); end; end Update; -- ------------------------------ -- Delete the value associated with the given name. -- Raises the Not_Found exception if the name was not found. -- ------------------------------ procedure Delete (Repository : in out Wallet_Repository; Name : in String) is Pos : Wallet_Maps.Cursor := Repository.Map.Find (Name); begin if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; declare Item : Wallet_Entry_Access := Wallet_Maps.Element (Pos); Iterator : Keys.Data_Key_Iterator; begin Keys.Initialize (Repository, Iterator, Item); -- Erase the data fragments used by the entry. Data.Delete_Data (Repository, Iterator); -- Erase the entry from the repository. Entries.Delete_Entry (Manager => Repository, Item => Item); Entries.Save (Manager => Repository); Repository.Entry_Indexes.Delete (Item.Id); Repository.Map.Delete (Pos); Free (Item); exception when others => -- Handle data or directory block corruption or IO error. Repository.Entry_Indexes.Delete (Item.Id); Repository.Map.Delete (Pos); Free (Item); raise; end; end Delete; function Contains (Repository : in Wallet_Repository; Name : in String) return Boolean is begin return Repository.Map.Contains (Name); end Contains; procedure Find (Repository : in out Wallet_Repository; Name : in String; Result : out Entry_Info) is Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); Item : Wallet_Entry_Access; begin if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; Item := Wallet_Maps.Element (Pos); if Item.Kind = T_INVALID then Log.Error ("Wallet entry {0} is corrupted", Name); raise Corrupted; end if; if not Item.Is_Wallet then Result.Size := Item.Size; Result.Block_Count := Item.Block_Count; else Result.Size := 0; Result.Block_Count := 0; end if; Result.Kind := Item.Kind; Result.Create_Date := Item.Create_Date; Result.Update_Date := Item.Update_Date; end Find; procedure Get_Data (Repository : in out Wallet_Repository; Name : in String; Result : out Entry_Info; Output : out Ada.Streams.Stream_Element_Array) is Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); begin if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; declare Item : constant Wallet_Entry_Access := Wallet_Maps.Element (Pos); Iterator : Keys.Data_Key_Iterator; begin if Item.Is_Wallet then Log.Info ("Data entry '{0}' is a wallet", Name); raise No_Content; end if; Result.Size := Item.Size; Result.Kind := Item.Kind; Result.Create_Date := Item.Create_Date; Result.Update_Date := Item.Update_Date; Keys.Initialize (Repository, Iterator, Item); Data.Get_Data (Repository, Iterator, Output); pragma Assert (Iterator.Current_Offset = Item.Size); end; end Get_Data; procedure Read (Repository : in out Wallet_Repository; Name : in String; Offset : in Ada.Streams.Stream_Element_Offset; Content : out Ada.Streams.Stream_Element_Array; Last : out Ada.Streams.Stream_Element_Offset) is Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); begin if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; declare Item : constant Wallet_Entry_Access := Wallet_Maps.Element (Pos); Iterator : Keys.Data_Key_Iterator; begin if Item.Is_Wallet then Log.Info ("Data entry '{0}' is a wallet", Name); raise No_Content; end if; if Item.Size <= Interfaces.Unsigned_64 (Offset) then Last := Content'First - 1; return; end if; Keys.Initialize (Repository, Iterator, Item); Data.Read (Repository, Iterator, Offset, Content, Last); end; end Read; procedure Write (Repository : in out Wallet_Repository; Name : in String; Offset : in Ada.Streams.Stream_Element_Offset; Content : in Ada.Streams.Stream_Element_Array) is Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); begin if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; declare Item : constant Wallet_Entry_Access := Wallet_Maps.Element (Pos); Iterator : Keys.Data_Key_Iterator; Data_Offset : Interfaces.Unsigned_64 := 0; begin if Item.Is_Wallet then Log.Info ("Data entry '{0}' is a wallet", Name); raise No_Content; end if; Keys.Initialize (Repository, Iterator, Item); Data.Write (Repository, Iterator, Offset, Content, Data_Offset); -- The item is now bigger, update its size. if Item.Size < Data_Offset then Entries.Update_Entry (Repository, Item, Item.Kind, Data_Offset); end if; Entries.Save (Repository); end; end Write; procedure Get_Data (Repository : in out Wallet_Repository; Name : in String; Output : in out Util.Streams.Output_Stream'Class) is Pos : constant Wallet_Maps.Cursor := Repository.Map.Find (Name); begin if not Wallet_Maps.Has_Element (Pos) then Log.Info ("Data entry '{0}' not found", Name); raise Not_Found; end if; declare Item : constant Wallet_Entry_Access := Wallet_Maps.Element (Pos); Iterator : Keys.Data_Key_Iterator; begin if Item.Is_Wallet then Log.Info ("Data entry '{0}' is a wallet", Name); raise No_Content; end if; Keys.Initialize (Repository, Iterator, Item); Data.Get_Data (Repository, Iterator, Output); end; end Get_Data; -- ------------------------------ -- Get the list of entries contained in the wallet that correspond to the optional filter. -- ------------------------------ procedure List (Repository : in out Wallet_Repository; Filter : in Filter_Type; Content : out Entry_Map) is Value : Entry_Info; begin for Item of Repository.Map loop if Filter (Item.Kind) then if not Item.Is_Wallet then Value.Size := Item.Size; Value.Block_Count := Item.Block_Count; else Value.Size := 0; Value.Block_Count := 1; end if; Value.Kind := Item.Kind; Value.Create_Date := Item.Create_Date; Value.Update_Date := Item.Update_Date; Content.Include (Key => Item.Name, New_Item => Value); end if; end loop; end List; procedure List (Repository : in out Wallet_Repository; Pattern : in GNAT.Regpat.Pattern_Matcher; Filter : in Filter_Type; Content : out Entry_Map) is Value : Entry_Info; begin for Item of Repository.Map loop if Filter (Item.Kind) and then GNAT.Regpat.Match (Pattern, Item.Name) then if not Item.Is_Wallet then Value.Size := Item.Size; Value.Block_Count := Item.Block_Count; else Value.Size := 0; Value.Block_Count := 1; end if; Value.Kind := Item.Kind; Value.Create_Date := Item.Create_Date; Value.Update_Date := Item.Update_Date; Content.Include (Key => Item.Name, New_Item => Value); end if; end loop; end List; -- ------------------------------ -- Get the key slot number that was used to unlock the keystore. -- ------------------------------ function Get_Key_Slot (Repository : in Wallet_Repository) return Key_Slot is begin return Repository.Config.Slot; end Get_Key_Slot; -- ------------------------------ -- Get stats information about the wallet (the number of entries, used key slots). -- ------------------------------ procedure Fill_Stats (Repository : in Wallet_Repository; Stats : in out Wallet_Stats) is begin Stats.UUID := Repository.Config.UUID; Stats.Keys := Repository.Config.Keys; Stats.Entry_Count := Natural (Repository.Map.Length); end Fill_Stats; procedure Close (Repository : in out Wallet_Repository) is Dir : Wallet_Directory_Entry_Access; First : Wallet_Maps.Cursor; Item : Wallet_Entry_Access; begin Entries.Save (Manager => Repository); Repository.Cache.Clear; while not Repository.Directory_List.Is_Empty loop Dir := Repository.Directory_List.First_Element; Repository.Directory_List.Delete_First; Free (Dir); end loop; Repository.Entry_Indexes.Clear; while not Repository.Map.Is_Empty loop First := Repository.Map.First; Item := Wallet_Maps.Element (First); Free (Item); Repository.Map.Delete (First); end loop; Free (Repository.Workers); end Close; procedure Set_Work_Manager (Repository : in out Wallet_Repository; Workers : in Keystore.Task_Manager_Access) is begin Free (Repository.Workers); Repository.Workers := Keystore.Repository.Workers.Create (Repository'Unchecked_Access, Workers, Workers.Count).all'Access; end Set_Work_Manager; overriding procedure Finalize (Manager : in out Wallet_Repository) is begin Manager.Close; end Finalize; end Keystore.Repository;
optikos/oasis
Ada
4,203
ads
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with Program.Elements.Expressions; with Program.Lexical_Elements; with Program.Elements.Parameter_Associations; with Program.Elements.Function_Calls; with Program.Element_Visitors; package Program.Nodes.Function_Calls is pragma Preelaborate; type Function_Call is new Program.Nodes.Node and Program.Elements.Function_Calls.Function_Call and Program.Elements.Function_Calls.Function_Call_Text with private; function Create (Prefix : not null Program.Elements.Expressions .Expression_Access; Left_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access; Parameters : Program.Elements.Parameter_Associations .Parameter_Association_Vector_Access; Right_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access) return Function_Call; type Implicit_Function_Call is new Program.Nodes.Node and Program.Elements.Function_Calls.Function_Call with private; function Create (Prefix : not null Program.Elements.Expressions .Expression_Access; Parameters : Program.Elements.Parameter_Associations .Parameter_Association_Vector_Access; Is_Part_Of_Implicit : Boolean := False; Is_Part_Of_Inherited : Boolean := False; Is_Part_Of_Instance : Boolean := False) return Implicit_Function_Call with Pre => Is_Part_Of_Implicit or Is_Part_Of_Inherited or Is_Part_Of_Instance; private type Base_Function_Call is abstract new Program.Nodes.Node and Program.Elements.Function_Calls.Function_Call with record Prefix : not null Program.Elements.Expressions.Expression_Access; Parameters : Program.Elements.Parameter_Associations .Parameter_Association_Vector_Access; end record; procedure Initialize (Self : aliased in out Base_Function_Call'Class); overriding procedure Visit (Self : not null access Base_Function_Call; Visitor : in out Program.Element_Visitors.Element_Visitor'Class); overriding function Prefix (Self : Base_Function_Call) return not null Program.Elements.Expressions.Expression_Access; overriding function Parameters (Self : Base_Function_Call) return Program.Elements.Parameter_Associations .Parameter_Association_Vector_Access; overriding function Is_Function_Call_Element (Self : Base_Function_Call) return Boolean; overriding function Is_Expression_Element (Self : Base_Function_Call) return Boolean; type Function_Call is new Base_Function_Call and Program.Elements.Function_Calls.Function_Call_Text with record Left_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access; Right_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access; end record; overriding function To_Function_Call_Text (Self : aliased in out Function_Call) return Program.Elements.Function_Calls.Function_Call_Text_Access; overriding function Left_Bracket_Token (Self : Function_Call) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Right_Bracket_Token (Self : Function_Call) return Program.Lexical_Elements.Lexical_Element_Access; type Implicit_Function_Call is new Base_Function_Call with record Is_Part_Of_Implicit : Boolean; Is_Part_Of_Inherited : Boolean; Is_Part_Of_Instance : Boolean; end record; overriding function To_Function_Call_Text (Self : aliased in out Implicit_Function_Call) return Program.Elements.Function_Calls.Function_Call_Text_Access; overriding function Is_Part_Of_Implicit (Self : Implicit_Function_Call) return Boolean; overriding function Is_Part_Of_Inherited (Self : Implicit_Function_Call) return Boolean; overriding function Is_Part_Of_Instance (Self : Implicit_Function_Call) return Boolean; end Program.Nodes.Function_Calls;
zertovitch/zip-ada
Ada
1,359
ads
-- Console I/O for ZipAda, UnZipAda and ReZip tools. -- It's not nice code (global variables), so please don't use it elsewhere. with UnZip; with Zip; with Ada.Strings.Unbounded; package Zip_Console_IO is package Summary is total_uncompressed, total_compressed : Zip.Zip_64_Data_Size_Type; total_entries : Natural; files_per_method : array (Zip.PKZip_method) of Natural; uncompressed_per_method, compressed_per_method : array (Zip.PKZip_method) of Zip.Zip_64_Data_Size_Type; -- procedure Reset; function Nice_image (format : Zip.PKZip_method) return String; end Summary; procedure My_feedback (percents_done : in Natural; entry_skipped : in Boolean; user_abort : out Boolean); procedure My_tell_data (file_name : String; compressed_bytes : Zip.Zip_64_Data_Size_Type; uncompressed_bytes : Zip.Zip_64_Data_Size_Type; method : Zip.PKZip_method); procedure My_resolve_conflict (file_name : in String; name_encoding : in Zip.Zip_name_encoding; action : out UnZip.Name_conflict_intervention; new_name : out String; new_name_length : out Natural); procedure My_get_password (password : out Ada.Strings.Unbounded.Unbounded_String); end Zip_Console_IO;
osannolik/ada-canopen
Ada
1,041
adb
package body ACO.Log is function Build_String (Level : Log_Level; Message : String) return String is begin return "[" & Level'Img & "] " & Message; end Build_String; procedure Put (Level : in Log_Level; Message : in String) is begin if Level /= Off and then Level >= Logger_Level and then Logger_Stream /= null then String'Write (Logger_Stream, Build_String (Level, Message)); end if; end Put; procedure Put_Line (Level : in Log_Level; Message : in String) is begin Put (Level, Message & ASCII.LF); end Put_Line; procedure Set_Level (Level : in Log_Level) is begin Logger_Level := Level; end Set_Level; procedure Set_Stream (Stream : access Root_Stream_Type'Class) is begin Logger_Stream := Stream; end Set_Stream; function Get_Stream return Stream_Access is begin return Stream_Access (Logger_Stream); end Get_Stream; end ACO.Log;
msrLi/portingSources
Ada
2,103
adb
-- Copyright 2008-2014 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. with Pck; use Pck; package body Homonym is type Integer_Range is new Integer range -100 .. 100; type Positive_Range is new Positive range 1 .. 19740804; --------------- -- Get_Value -- --------------- function Get_Value return Integer_Range is subtype Local_Type is Integer_Range; subtype Local_Type_Subtype is Local_Type; subtype Int_Type is Integer_Range; Lcl : Local_Type := 29; Some_Local_Type_Subtype : Local_Type_Subtype := Lcl; I : Int_Type := 1; begin Do_Nothing (Some_Local_Type_Subtype'Address); Do_Nothing (I'Address); return Lcl; -- BREAK_1 end Get_Value; --------------- -- Get_Value -- --------------- function Get_Value return Positive_Range is subtype Local_Type is Positive_Range; subtype Local_Type_Subtype is Local_Type; subtype Pos_Type is Positive_Range; Lcl : Local_Type := 17; Some_Local_Type_Subtype : Local_Type_Subtype := Lcl; P : Pos_Type := 2; begin Do_Nothing (Some_Local_Type_Subtype'Address); Do_Nothing (P'Address); return Lcl; -- BREAK_2 end Get_Value; ---------------- -- Start_Test -- ---------------- procedure Start_Test is Int : Integer_Range; Pos : Positive_Range; begin Int := Get_Value; Pos := Get_Value; end Start_Test; end Homonym;
charlie5/lace
Ada
2,464
adb
with openGL.Primitive.indexed; package body openGL.Model.line.colored is --------- --- Forge -- function to_line_Model (Color : in openGL.Color; End_1, End_2 : in Vector_3 := Origin_3D) return Item is Self : Item; begin Self.Color := +Color; Self.Vertices (1).Site := End_1; Self.Vertices (2).Site := End_2; Self.set_Bounds; return Self; end to_line_Model; function new_line_Model (Color : in openGL.Color; End_1, End_2 : in Vector_3 := Origin_3D) return View is begin return new Item' (to_line_Model (Color, End_1, End_2)); end new_line_Model; -------------- --- Attributes -- overriding function to_GL_Geometries (Self : access Item; Textures : access Texture.name_Map_of_texture'Class; Fonts : in Font.font_id_Map_of_font) return Geometry.views is pragma unreferenced (Textures, Fonts); use Geometry.colored; indices_Count : constant long_Index_t := 2; the_Indices : aliased Indices := [1 .. indices_Count => <>]; the_Primitive : Primitive.indexed.view; begin if Self.Geometry = null then Self.Geometry := Geometry.colored.new_Geometry; end if; set_Sites: begin Self.Vertices (1).Color := (Primary => Self.Color, Alpha => opaque_Value); Self.Vertices (2).Color := (Primary => Self.Color, Alpha => opaque_Value); end set_Sites; the_Indices := [1, 2]; Self.Geometry.is_Transparent (False); Self.Geometry.Vertices_are (Self.Vertices); the_Primitive := Primitive.indexed.new_Primitive (Primitive.Lines, the_Indices); Self.Geometry.add (Primitive.view (the_Primitive)); return [1 => Self.Geometry]; end to_GL_Geometries; function Site (Self : in Item; for_End : in end_Id) return Vector_3 is begin return Self.Vertices (for_End).Site; end Site; procedure Site_is (Self : in out Item; Now : in Vector_3; for_End : in end_Id) is use Geometry.colored; begin Self.Vertices (for_End).Site := Now; Self.Geometry.Vertices_are (Self.Vertices); Self.set_Bounds; end Site_is; end openGL.Model.line.colored;
PThierry/ewok-kernel
Ada
2,041
ads
-- -- Copyright 2018 The wookey project team <[email protected]> -- - Ryad Benadjila -- - Arnauld Michelizza -- - Mathieu Renard -- - Philippe Thierry -- - Philippe Trebuchet -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. -- -- with types.c; with ewok.exported.interrupts; with ewok.exported.gpios; package ewok.exported.devices with spark_mode => off is MAX_INTERRUPTS : constant := 4; MAX_GPIOS : constant := 16; subtype t_device_name is types.c.c_string (1 .. 16); type t_device_name_access is access all t_device_name; type t_interrupt_config_array is array (unsigned_8 range <>) of aliased ewok.exported.interrupts.t_interrupt_config; type t_gpio_config_array is array (unsigned_8 range <>) of aliased ewok.exported.gpios.t_gpio_config; type t_dev_map_mode is (DEV_MAP_AUTO, DEV_MAP_VOLUNTARY); type t_user_device is record name : t_device_name; base_addr : system_address := 0; size : unsigned_32 := 0; interrupt_num : unsigned_8 range 0 .. MAX_INTERRUPTS := 0; gpio_num : unsigned_8 range 0 .. MAX_GPIOS := 0; map_mode : t_dev_map_mode; interrupts : t_interrupt_config_array (1 .. MAX_INTERRUPTS); gpios : t_gpio_config_array (1 .. MAX_GPIOS); end record; type t_user_device_access is access all t_user_device; end ewok.exported.devices;
optikos/ada-lsp
Ada
272
ads
with Incr.Parsers.Incremental; package Ada_LSP.Documents.Debug is package P renames Incr.Parsers.Incremental.Parser_Data_Providers; procedure Dump (Self : Document; Name : String; Data : P.Parser_Data_Provider'Class); end Ada_LSP.Documents.Debug;
luk9400/nsi
Ada
4,140
adb
package body Railway with SPARK_Mode is procedure Open_Route (Route: in Route_Type; Success: out Boolean) is begin if Route = Route_Enter_Left and Segment_State.Left = Free then Segment_State.Left := Reserved_Moving_From_Left; Success := True; elsif Route = Route_Left_Middle and Segment_State.Left = Occupied_Standing and Segment_State.Middle = Free then Segment_State.Left := Occupied_Moving_Right; Segment_State.Middle := Reserved_Moving_From_Left; Signal_State.Left_Middle := Green; Success := True; elsif Route = Route_Middle_Right and Segment_State.Middle = Occupied_Standing and Segment_State.Right = Free then Segment_State.Middle := Occupied_Moving_Right; Segment_State.Right := Reserved_Moving_From_Left; Signal_State.Middle_Right := Green; Success := True; elsif Route = Route_Leave_Right and Segment_State.Right = Occupied_Standing then Segment_State.Right := Occupied_Moving_Right; Success := True; elsif Route = Route_Enter_Right and Segment_State.Right = Free then Segment_State.Right := Reserved_Moving_From_Right; Success := True; elsif Route = Route_Right_Middle and Segment_State.Right = Occupied_Standing and Segment_State.Middle = Free then Segment_State.Right := Occupied_Moving_Left; Segment_State.Middle := Reserved_Moving_From_Right; Signal_State.Right_Middle := Green; Success := True; elsif Route = Route_Middle_Left and Segment_State.Middle = Occupied_Standing and Segment_State.Left = Free then Segment_State.Middle := Occupied_Moving_Left; Segment_State.Left := Reserved_Moving_From_Right; Signal_State.Middle_Left := Green; Success := True; elsif Route = Route_Leave_Left and Segment_State.Left = Occupied_Standing then Segment_State.Left := Occupied_Moving_Left; Success := True; else Success := False; end if; end Open_Route; procedure Move_Train (Route: in Route_Type; Success: out Boolean) is begin if Route = Route_Enter_Left and Segment_State.Left = Reserved_Moving_From_Left then Segment_State.Left := Occupied_Standing; Success := True; elsif Route = Route_Left_Middle and Segment_State.Left = Occupied_Moving_Right and Segment_State.Middle = Reserved_Moving_From_Left then Segment_State.Left := Free; Segment_State.Middle := Occupied_Standing; Signal_State.Left_Middle := Red; Success := True; elsif Route = Route_Middle_Right and Segment_State.Middle = Occupied_Moving_Right and Segment_State.Right = Reserved_Moving_From_Left then Segment_State.Middle := Free; Segment_State.Right := Occupied_Standing; Signal_State.Middle_Right := Red; Success := True; elsif Route = Route_Leave_Right and Segment_State.Right = Occupied_Moving_Right then Segment_State.Right := Free; Success := True; elsif Route = Route_Enter_Right and Segment_State.Right = Reserved_Moving_From_Right then Segment_State.Right := Occupied_Standing; Success := True; elsif Route = Route_Right_Middle and Segment_State.Right = Occupied_Moving_Left and Segment_State.Middle = Reserved_Moving_From_Right then Segment_State.Right := Free; Segment_State.Middle := Occupied_Standing; Signal_State.Right_Middle := Red; Success := True; elsif Route = Route_Middle_Left and Segment_State.Middle = Occupied_Moving_Left and Segment_State.Left = Reserved_Moving_From_Right then Segment_State.Middle := Free; Segment_State.Left := Occupied_Standing; Signal_State.Middle_Left := Red; Success := True; elsif Route = Route_Leave_Left and Segment_State.Left = Occupied_Moving_Left then Segment_State.Left := Free; Success := True; else Success := False; end if; end Move_Train; end Railway;
zhmu/ananas
Ada
3,641
ads
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- A D A . W I D E _ T E X T _ I O . I N T E G E R _ A U X -- -- -- -- S p e c -- -- -- -- Copyright (C) 1992-2022, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This package contains the implementation for Ada.Wide_Text_IO.Integer_IO -- and Ada.Wide_Text_IO.Modular_IO. The routines in this package are identical -- semantically to those in Integer_IO and Modular_IO themselves, except that -- the default parameters have been removed because they are supplied -- explicitly by the calls from within these units. private generic type Num is (<>); with procedure Scan (Str : String; Ptr : not null access Integer; Max : Integer; Res : out Num); with procedure Set_Image (V : Num; S : in out String; P : in out Natural); with procedure Set_Image_Width (V : Num; W : Integer; S : out String; P : in out Natural); with procedure Set_Image_Based (V : Num; B : Natural; W : Integer; S : out String; P : in out Natural); package Ada.Wide_Text_IO.Integer_Aux is procedure Get (File : File_Type; Item : out Num; Width : Field); procedure Gets (From : String; Item : out Num; Last : out Positive); procedure Put (File : File_Type; Item : Num; Width : Field; Base : Number_Base); procedure Puts (To : out String; Item : Num; Base : Number_Base); end Ada.Wide_Text_IO.Integer_Aux;