Skip to content
Merged
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
Original file line number Diff line number Diff line change
Expand Up @@ -29,10 +29,10 @@ public SynchronizeXmlDocSection(IPipeline<SyncContext, bool> parent, Cancellatio
XmlDocInspectionParser xmlInspectionParser)
: base(parent, tokenSource, logger)
{
Block = new JustFuckingDoEverything(this, tokenSource, logger, content, inspections, quickfixes, annotations, tagServices, github, mergeService, staging, xmlAnnotationParser, xmlQuickFixParser, xmlInspectionParser);
Block = new SynchronizeXmlDocBlock(this, tokenSource, logger, content, inspections, quickfixes, annotations, tagServices, github, mergeService, staging, xmlAnnotationParser, xmlQuickFixParser, xmlInspectionParser);
}

public JustFuckingDoEverything Block { get; }
public SynchronizeXmlDocBlock Block { get; }

protected override IReadOnlyDictionary<string, IDataflowBlock> Blocks => new Dictionary<string, IDataflowBlock>
{
Expand All @@ -45,7 +45,7 @@ public override void CreateBlocks()
}
}

public class JustFuckingDoEverything : ActionBlockBase<SyncRequestParameters, SyncContext>
public class SynchronizeXmlDocBlock : ActionBlockBase<SyncRequestParameters, SyncContext>
{
private readonly IRubberduckDbService _content;
private readonly IRepository<InspectionEntity> _inspections;
Expand All @@ -59,7 +59,7 @@ public class JustFuckingDoEverything : ActionBlockBase<SyncRequestParameters, Sy
private readonly XmlDocQuickFixParser _xmlQuickFixParser;
private readonly XmlDocInspectionParser _xmlInspectionParser;

public JustFuckingDoEverything(PipelineSection<SyncContext> parent, CancellationTokenSource tokenSource, ILogger logger,
public SynchronizeXmlDocBlock(PipelineSection<SyncContext> parent, CancellationTokenSource tokenSource, ILogger logger,
IRubberduckDbService content,
IRepository<InspectionEntity> inspections,
IRepository<QuickFixEntity> quickfixes,
Expand Down Expand Up @@ -334,11 +334,11 @@ public SyncXmldocSection(IPipeline<SyncContext, bool> parent, CancellationTokenS
PrepareStaging = new PrepareStagingBlock(this, tokenSource, logger);
SaveStaging = new BulkSaveStagingBlock(this, tokenSource, staging, logger);
*/
JustFuckingDoIt = new JustFuckingDoEverything(this, tokenSource, logger, content, inspections, quickfixes, annotations, tagServices, github, mergeService, staging, xmlAnnotationParser, xmlQuickFixParser, xmlInspectionParser);
SynchronizeXmlDoc = new SynchronizeXmlDocBlock(this, tokenSource, logger, content, inspections, quickfixes, annotations, tagServices, github, mergeService, staging, xmlAnnotationParser, xmlQuickFixParser, xmlInspectionParser);
}

#region blocks
private JustFuckingDoEverything JustFuckingDoIt { get; }
private SynchronizeXmlDocBlock SynchronizeXmlDoc { get; }
/*
private ReceiveRequestBlock ReceiveRequest { get; }
private BroadcastParametersBlock BroadcastParameters { get; }
Expand Down Expand Up @@ -384,8 +384,8 @@ public SyncXmldocSection(IPipeline<SyncContext, bool> parent, CancellationTokenS
private PrepareStagingBlock PrepareStaging { get; }
private BulkSaveStagingBlock SaveStaging { get; }
*/
public ITargetBlock<XmldocSyncRequestParameters> InputBlock => JustFuckingDoIt.Block;
public IDataflowBlock OutputBlock => JustFuckingDoIt.Block;
public ITargetBlock<XmldocSyncRequestParameters> InputBlock => SynchronizeXmlDoc.Block;
public IDataflowBlock OutputBlock => SynchronizeXmlDoc.Block;

protected override IReadOnlyDictionary<string, IDataflowBlock> Blocks => new Dictionary<string, IDataflowBlock>
{
Expand Down Expand Up @@ -435,7 +435,7 @@ public SyncXmldocSection(IPipeline<SyncContext, bool> parent, CancellationTokenS
[nameof(PrepareStaging)] = PrepareStaging.Block,
[nameof(SaveStaging)] = SaveStaging.Block,
*/
[nameof(JustFuckingDoIt)] = JustFuckingDoIt.Block,
[nameof(SynchronizeXmlDoc)] = SynchronizeXmlDoc.Block,
};
#endregion

Expand Down Expand Up @@ -487,6 +487,6 @@ public override void CreateBlocks()
PrepareStaging.CreateBlock(JoinStagingSources);
SaveStaging.CreateBlock(PrepareStaging);
*/
JustFuckingDoIt.CreateBlock();
SynchronizeXmlDoc.CreateBlock();
}
}
Original file line number Diff line number Diff line change
Expand Up @@ -111,6 +111,9 @@ private IEnumerable<AnnotationExample> ParseExamples(XElement node)
*/
before = example.Elements(XmlDocSchema.Annotation.Example.Before.ElementName)
.Select((e, i) => ExtractCodeModule(e.Element(XmlDocSchema.Annotation.Example.Before.Module.ElementName)!, i, "(code pane)"));

after = example.Elements(XmlDocSchema.Annotation.Example.After.ElementName)
.Select((e, i) => ExtractCodeModule(e.Element(XmlDocSchema.Annotation.Example.Before.Module.ElementName)!, i, "(exported code)"));
}

if (before.Any() && (after?.Any() ?? false))
Expand Down
1 change: 1 addition & 0 deletions rubberduckvba.Server/Data/AnnotationsRepository.cs
Original file line number Diff line number Diff line change
Expand Up @@ -61,6 +61,7 @@ INSERT INTO [dbo].[Annotations] (
UPDATE [dbo].[Annotations]
SET [DateTimeUpdated]=GETDATE(),
[TagAssetId]=@tagAssetId,
[SourceUrl]=@sourceUrl,
[Summary]=@summary,
[Remarks]=@remarks,
[JsonParameters]=@jsonParameters,
Expand Down
1 change: 1 addition & 0 deletions rubberduckvba.Server/Data/InspectionsRepository.cs
Original file line number Diff line number Diff line change
Expand Up @@ -76,6 +76,7 @@ INSERT INTO [dbo].[Inspections] (
UPDATE [dbo].[Inspections]
SET [DateTimeUpdated]=GETDATE(),
[TagAssetId]=@tagAssetId,
[SourceUrl]=@sourceUrl,
[InspectionType]=@inspectionType,
[DefaultSeverity]=@defaultSeverity,
[Summary]=@summary,
Expand Down
1 change: 1 addition & 0 deletions rubberduckvba.Server/Data/QuickFixRepository.cs
Original file line number Diff line number Diff line change
Expand Up @@ -73,6 +73,7 @@ INSERT INTO [dbo].[QuickFixes] (
UPDATE [dbo].[QuickFixes]
SET [DateTimeUpdated]=GETDATE(),
[TagAssetId]=@tagAssetId,
[SourceUrl]=@sourceUrl,
[Summary]=@summary,
[Remarks]=@remarks,
[CanFixMultiple]=@canFixMultiple,
Expand Down