Skip to content

Commit a37331e

Browse files
committed
Renamed StandAloneModuleToModuleReferenceManager to ModuleToModuleReferenceManager
1 parent 6d56231 commit a37331e

File tree

6 files changed

+6
-6
lines changed

6 files changed

+6
-6
lines changed

RetailCoder.VBE/API/ParserState.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -68,7 +68,7 @@ public void Initialize(Microsoft.Vbe.Interop.VBE vbe)
6868
Func<IVBAPreprocessor> preprocessorFactory = () => new VBAPreprocessor(double.Parse(_vbe.Version, CultureInfo.InvariantCulture));
6969
_attributeParser = new AttributeParser(new ModuleExporter(), preprocessorFactory);
7070
var projectManager = new ProjectManager(_state, _vbe);
71-
var moduleToModuleReferenceManager = new StandAloneModuleToModuleReferenceManager();
71+
var moduleToModuleReferenceManager = new ModuleToModuleReferenceManager();
7272
var parserStateManager = new ParserStateManager(_state);
7373
var referenceRemover = new ReferenceRemover(_state, moduleToModuleReferenceManager);
7474
var comSynchronizer = new COMReferenceSynchronizer(_state, parserStateManager);

RetailCoder.VBE/Root/RubberduckModule.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -105,7 +105,7 @@ public override void Load()
105105
Rebind<ICOMReferenceSynchronizer, IProjectReferencesProvider>().To<COMReferenceSynchronizer>().InSingletonScope().WithConstructorArgument("serializedDeclarationsPath", (string)null);
106106
Rebind<IBuiltInDeclarationLoader>().To<BuiltInDeclarationLoader>().InSingletonScope();
107107
Rebind<IDeclarationResolveRunner>().To<DeclarationResolveRunner>().InSingletonScope();
108-
Rebind<IModuleToModuleReferenceManager>().To<StandAloneModuleToModuleReferenceManager>().InSingletonScope();
108+
Rebind<IModuleToModuleReferenceManager>().To<ModuleToModuleReferenceManager>().InSingletonScope();
109109
Rebind<IParserStateManager>().To<ParserStateManager>().InSingletonScope();
110110
Rebind<IParseRunner>().To<ParseRunner>().InSingletonScope();
111111
Rebind<IParsingStageService>().To<ParsingStageService>().InSingletonScope();

Rubberduck.Parsing/Rubberduck.Parsing.csproj

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -335,7 +335,7 @@
335335
<Compile Include="VBA\AttributeParser.cs" />
336336
<Compile Include="VBA\Attributes.cs" />
337337
<Compile Include="VBA\BuiltInDeclarationLoader.cs" />
338-
<Compile Include="VBA\StandAloneModuleToModuleReferenceManager.cs" />
338+
<Compile Include="VBA\ModuleToModuleReferenceManager.cs" />
339339
<Compile Include="VBA\IDeclarationFinderProvider.cs" />
340340
<Compile Include="VBA\IParseTreeProvider.cs" />
341341
<Compile Include="VBA\ParsingStageService.cs" />

Rubberduck.Parsing/VBA/StandAloneModuleToModuleReferenceManager.cs renamed to Rubberduck.Parsing/VBA/ModuleToModuleReferenceManager.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -4,7 +4,7 @@
44

55
namespace Rubberduck.Parsing.VBA
66
{
7-
public class StandAloneModuleToModuleReferenceManager : ModuleToModuleReferenceManagerBase
7+
public class ModuleToModuleReferenceManager : ModuleToModuleReferenceManagerBase
88
{
99
private ConcurrentDictionary<QualifiedModuleName, ConcurrentDictionary<QualifiedModuleName, byte>> _referencesFrom = new ConcurrentDictionary<QualifiedModuleName, ConcurrentDictionary<QualifiedModuleName, byte>>();
1010
private ConcurrentDictionary<QualifiedModuleName, ConcurrentDictionary<QualifiedModuleName, byte>> _referencesTo = new ConcurrentDictionary<QualifiedModuleName, ConcurrentDictionary<QualifiedModuleName, byte>>();

RubberduckTests/Mocks/MockParser.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -47,7 +47,7 @@ public static ParseCoordinator Create(IVBE vbe, RubberduckParserState state, IAt
4747
Path.Combine(Path.GetDirectoryName(Assembly.GetAssembly(typeof(MockParser)).Location), "TestFiles", "Resolver");
4848
Func<IVBAPreprocessor> preprocessorFactory = () => new VBAPreprocessor(double.Parse(vbe.Version, CultureInfo.InvariantCulture));
4949
var projectManager = new ProjectManager(state, vbe);
50-
var moduleToModuleReferenceManager = new StandAloneModuleToModuleReferenceManager();
50+
var moduleToModuleReferenceManager = new ModuleToModuleReferenceManager();
5151
var parserStateManager = new SynchronousParserStateManager(state);
5252
var referenceRemover = new SynchronousReferenceRemover(state, moduleToModuleReferenceManager);
5353
var comSynchronizer = new SynchronousCOMReferenceSynchronizer(

RubberduckTests/Parsing/Coordination/StandAloneModuleToModuleReferenceManagerTests.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,7 @@ public class StandAloneModuleToModuleReferenceManagerTests : IModuleToModuleRefe
1111
{
1212
protected override IModuleToModuleReferenceManager GetNewTestModuleToModuleReferenceManager()
1313
{
14-
return new StandAloneModuleToModuleReferenceManager();
14+
return new ModuleToModuleReferenceManager();
1515
}
1616
}
1717
}

0 commit comments

Comments
 (0)