Skip to content

Commit 870cbdf

Browse files
committed
Revert Description -> MemberDescription rename because I was an idiot
1 parent 73a3ffd commit 870cbdf

File tree

6 files changed

+6
-6
lines changed

6 files changed

+6
-6
lines changed

Rubberduck.Parsing/Annotations/AnnotationType.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -57,7 +57,7 @@ public enum AnnotationType
5757
NoIndent = 1 << 18 | ModuleAnnotation,
5858
Interface = 1 << 19 | ModuleAnnotation,
5959
[FlexibleAttributeValueAnnotation("VB_Description", 1)]
60-
MemberDescription = 1 << 13 | Attribute | MemberAnnotation,
60+
Description = 1 << 13 | Attribute | MemberAnnotation,
6161
[FixedAttributeValueAnnotation("VB_UserMemId", "0")]
6262
DefaultMember = 1 << 14 | Attribute | MemberAnnotation,
6363
[FixedAttributeValueAnnotation("VB_UserMemId", "-4")]

Rubberduck.Parsing/Annotations/DescriptionAnnotation.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -10,7 +10,7 @@ namespace Rubberduck.Parsing.Annotations
1010
public sealed class DescriptionAnnotation : DescriptionAttributeAnnotationBase
1111
{
1212
public DescriptionAnnotation(QualifiedSelection qualifiedSelection, VBAParser.AnnotationContext context, IEnumerable<string> parameters)
13-
: base(AnnotationType.MemberDescription, qualifiedSelection, context, parameters)
13+
: base(AnnotationType.Description, qualifiedSelection, context, parameters)
1414
{}
1515
}
1616
}

Rubberduck.Parsing/Annotations/VBAParserAnnotationFactory.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -24,7 +24,7 @@ public VBAParserAnnotationFactory()
2424
_creators.Add(AnnotationType.Folder.ToString().ToUpperInvariant(), typeof(FolderAnnotation));
2525
_creators.Add(AnnotationType.NoIndent.ToString().ToUpperInvariant(), typeof(NoIndentAnnotation));
2626
_creators.Add(AnnotationType.Interface.ToString().ToUpperInvariant(), typeof(InterfaceAnnotation));
27-
_creators.Add(AnnotationType.MemberDescription.ToString().ToUpperInvariant(), typeof (DescriptionAnnotation));
27+
_creators.Add(AnnotationType.Description.ToString().ToUpperInvariant(), typeof (DescriptionAnnotation));
2828
_creators.Add(AnnotationType.PredeclaredId.ToString().ToUpperInvariant(), typeof(PredeclaredIdAnnotation));
2929
_creators.Add(AnnotationType.DefaultMember.ToString().ToUpperInvariant(), typeof(DefaultMemberAnnotation));
3030
_creators.Add(AnnotationType.Enumerator.ToString().ToUpperInvariant(), typeof(EnumeratorMemberAnnotation));

RubberduckTests/Annotations/AttributeAnnotationProviderTests.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -58,7 +58,7 @@ public void ModuleAttributeAnnotationReturnsSpecializedAnnotationsWhereApplicabl
5858
}
5959

6060
[TestCase("VB_ProcData.VB_Invoke_Func", @"A\n14", AnnotationType.ExcelHotKey, "A")]
61-
[TestCase("VB_Description", "\"SomeDescription\"", AnnotationType.MemberDescription, "\"SomeDescription\"")]
61+
[TestCase("VB_Description", "\"SomeDescription\"", AnnotationType.Description, "\"SomeDescription\"")]
6262
[TestCase("VB_VarDescription", "\"SomeDescription\"", AnnotationType.VariableDescription, "\"SomeDescription\"")]
6363
[TestCase("VB_UserMemId", "0", AnnotationType.DefaultMember)]
6464
[TestCase("VB_UserMemId", "-4", AnnotationType.Enumerator)]

RubberduckTests/Grammar/AnnotationTests.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -139,7 +139,7 @@ public void MemberAttributeAnnotation_TypeIsMemberAttribute()
139139
public void DescriptionAnnotation_TypeIsDescription()
140140
{
141141
var annotation = new DescriptionAnnotation(new QualifiedSelection(), null, new[] { "Desc"});
142-
Assert.AreEqual(AnnotationType.MemberDescription, annotation.AnnotationType);
142+
Assert.AreEqual(AnnotationType.Description, annotation.AnnotationType);
143143
}
144144

145145
[Category("Grammar")]

RubberduckTests/PostProcessing/AnnotationUpdaterTests.cs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -728,7 +728,7 @@ End Sub
728728
var fooDeclaration = state.DeclarationFinder
729729
.UserDeclarations(DeclarationType.Procedure)
730730
.First(decl => decl.IdentifierName == "Foo");
731-
var annotationToUpdate = fooDeclaration.Annotations.First(annotation => annotation.AnnotationType == AnnotationType.MemberDescription);
731+
var annotationToUpdate = fooDeclaration.Annotations.First(annotation => annotation.AnnotationType == AnnotationType.Description);
732732
var annotationUpdater = new AnnotationUpdater();
733733

734734
annotationUpdater.UpdateAnnotation(rewriteSession, annotationToUpdate, newAnnotation, newAnnotationValues);

0 commit comments

Comments
 (0)