diff --git a/RetailCoder.VBE/Inspections/VariableTypeNotDeclaredInspectionResult.cs b/RetailCoder.VBE/Inspections/VariableTypeNotDeclaredInspectionResult.cs index 6dfc931d4e..7ffb7dab44 100644 --- a/RetailCoder.VBE/Inspections/VariableTypeNotDeclaredInspectionResult.cs +++ b/RetailCoder.VBE/Inspections/VariableTypeNotDeclaredInspectionResult.cs @@ -37,7 +37,8 @@ public override void Fix() // methods return empty string if soft-cast context is null - just concat results: string originalInstruction; - var fix = DeclareExplicitVariant(Context.Parent as VBAParser.VariableSubStmtContext, out originalInstruction); + + var fix = DeclareExplicitVariant(Context as VBAParser.VariableSubStmtContext, out originalInstruction); if (string.IsNullOrEmpty(originalInstruction)) { @@ -46,7 +47,12 @@ public override void Fix() if (string.IsNullOrEmpty(originalInstruction)) { - fix = DeclareExplicitVariant(Context.Parent as VBAParser.ArgContext, out originalInstruction); + fix = DeclareExplicitVariant(Context as VBAParser.ArgContext, out originalInstruction); + } + + if (string.IsNullOrEmpty(originalInstruction)) + { + return; } var fixedCodeLine = codeLine.Replace(originalInstruction, fix); diff --git a/RetailCoder.VBE/Rubberduck.csproj b/RetailCoder.VBE/Rubberduck.csproj index 67f1ab3b57..e23cb51d4e 100644 --- a/RetailCoder.VBE/Rubberduck.csproj +++ b/RetailCoder.VBE/Rubberduck.csproj @@ -400,10 +400,10 @@ True RubberduckUI.de.resx - + True True - RubberduckUI.jp.resx + RubberduckUI.ja.resx True @@ -756,9 +756,9 @@ PublicResXFileCodeGenerator RubberduckUI.de.Designer.cs - + PublicResXFileCodeGenerator - RubberduckUI.jp.Designer.cs + RubberduckUI.ja.Designer.cs PublicResXFileCodeGenerator diff --git a/RetailCoder.VBE/UI/RubberduckUI.Designer.cs b/RetailCoder.VBE/UI/RubberduckUI.Designer.cs index 88f821f4ab..72c8e06b09 100644 --- a/RetailCoder.VBE/UI/RubberduckUI.Designer.cs +++ b/RetailCoder.VBE/UI/RubberduckUI.Designer.cs @@ -886,7 +886,7 @@ public class RubberduckUI { /// public static System.Drawing.Icon Ducky { get { - object obj = ResourceManager.GetObject("Ducky", resourceCulture); + object obj = ResourceManager.GetObject("Ducky"); return ((System.Drawing.Icon)(obj)); } } diff --git a/RetailCoder.VBE/UI/RubberduckUI.jp.Designer.cs b/RetailCoder.VBE/UI/RubberduckUI.ja.Designer.cs similarity index 100% rename from RetailCoder.VBE/UI/RubberduckUI.jp.Designer.cs rename to RetailCoder.VBE/UI/RubberduckUI.ja.Designer.cs diff --git a/RetailCoder.VBE/UI/RubberduckUI.jp.resx b/RetailCoder.VBE/UI/RubberduckUI.ja.resx similarity index 99% rename from RetailCoder.VBE/UI/RubberduckUI.jp.resx rename to RetailCoder.VBE/UI/RubberduckUI.ja.resx index 9377357bda..8205e3cfdf 100644 --- a/RetailCoder.VBE/UI/RubberduckUI.jp.resx +++ b/RetailCoder.VBE/UI/RubberduckUI.ja.resx @@ -1,4 +1,4 @@ - + - + @@ -623,7 +623,7 @@ フランス語 - + 日本語 @@ -1113,7 +1113,7 @@ &vナビゲート - + - + \ No newline at end of file diff --git a/Rubberduck.Parsing/Symbols/DeclarationSymbolsListener.cs b/Rubberduck.Parsing/Symbols/DeclarationSymbolsListener.cs index e28d839a6b..355eac3c27 100644 --- a/Rubberduck.Parsing/Symbols/DeclarationSymbolsListener.cs +++ b/Rubberduck.Parsing/Symbols/DeclarationSymbolsListener.cs @@ -3,7 +3,6 @@ using Microsoft.Vbe.Interop; using Rubberduck.Parsing.Grammar; using Rubberduck.VBEditor; -using Rubberduck.VBEditor.VBEInterfaces.RubberduckCodePane; namespace Rubberduck.Parsing.Symbols { @@ -13,21 +12,19 @@ public class DeclarationSymbolsListener : VBABaseListener public Declarations Declarations { get { return _declarations; } } private readonly QualifiedModuleName _qualifiedName; - private readonly ICodePaneWrapperFactory _wrapperFactory; private readonly Declaration _moduleDeclaration; private string _currentScope; private Declaration _parentDeclaration; - public DeclarationSymbolsListener(VBComponentParseResult result, ICodePaneWrapperFactory wrapperFactory) - : this(result.QualifiedName, Accessibility.Implicit, result.Component.Type, wrapperFactory) + public DeclarationSymbolsListener(VBComponentParseResult result) + : this(result.QualifiedName, Accessibility.Implicit, result.Component.Type) { } - public DeclarationSymbolsListener(QualifiedModuleName qualifiedName, Accessibility componentAccessibility, vbext_ComponentType type, ICodePaneWrapperFactory wrapperFactory) + public DeclarationSymbolsListener(QualifiedModuleName qualifiedName, Accessibility componentAccessibility, vbext_ComponentType type) { _qualifiedName = qualifiedName; - _wrapperFactory = wrapperFactory; var declarationType = type == vbext_ComponentType.vbext_ct_StdModule ? DeclarationType.Module diff --git a/Rubberduck.Parsing/Symbols/VbaStandardLib.cs b/Rubberduck.Parsing/Symbols/VbaStandardLib.cs index 797f57015a..e92bd8384f 100644 --- a/Rubberduck.Parsing/Symbols/VbaStandardLib.cs +++ b/Rubberduck.Parsing/Symbols/VbaStandardLib.cs @@ -2,7 +2,6 @@ using System.Linq; using System.Reflection; using Rubberduck.VBEditor; -using Rubberduck.VBEditor.VBEInterfaces.RubberduckCodePane; namespace Rubberduck.Parsing.Symbols { @@ -13,7 +12,6 @@ internal static class VbaStandardLib { private static IEnumerable _standardLibDeclarations; private static readonly QualifiedModuleName VbaModuleName = new QualifiedModuleName("VBA", "VBA"); - private static readonly ICodePaneWrapperFactory WrapperFactory = new CodePaneWrapperFactory(); public static IEnumerable Declarations { diff --git a/Rubberduck.Parsing/VBComponentParseResult.cs b/Rubberduck.Parsing/VBComponentParseResult.cs index f19ba759ed..d6db869efb 100644 --- a/Rubberduck.Parsing/VBComponentParseResult.cs +++ b/Rubberduck.Parsing/VBComponentParseResult.cs @@ -19,7 +19,7 @@ public VBComponentParseResult(VBComponent component, IParseTree parseTree, IEnum _comments = comments; _tokenStream = tokenStream; - var listener = new DeclarationSymbolsListener(_qualifiedName, Accessibility.Implicit, _component.Type, wrapperFactory); + var listener = new DeclarationSymbolsListener(_qualifiedName, Accessibility.Implicit, _component.Type); var walker = new ParseTreeWalker(); walker.Walk(listener, _parseTree); diff --git a/Rubberduck.Parsing/VBProjectParseResult.cs b/Rubberduck.Parsing/VBProjectParseResult.cs index 36f867fd7b..0131c01eb3 100644 --- a/Rubberduck.Parsing/VBProjectParseResult.cs +++ b/Rubberduck.Parsing/VBProjectParseResult.cs @@ -18,7 +18,7 @@ public VBProjectParseResult(VBProject project, IEnumerable