swarm-0.7.0.0: 2D resource gathering game with programmable robots
LicenseBSD-3-Clause
Safe HaskellNone
LanguageHaskell2010

Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Description

Types strictly for debugging structure recognition via the web interface

Documentation

data ParticipatingEntity e Source #

Instances

Instances details
Functor ParticipatingEntity Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

ToJSON e => ToJSON (ParticipatingEntity e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Generic (ParticipatingEntity e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Associated Types

type Rep (ParticipatingEntity e) 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (ParticipatingEntity e) = D1 ('MetaData "ParticipatingEntity" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "ParticipatingEntity" 'PrefixI 'True) (S1 ('MetaSel ('Just "entity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 e) :*: S1 ('MetaSel ('Just "searchOffsets") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 InspectionOffsets)))
type Rep (ParticipatingEntity e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (ParticipatingEntity e) = D1 ('MetaData "ParticipatingEntity" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "ParticipatingEntity" 'PrefixI 'True) (S1 ('MetaSel ('Just "entity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 e) :*: S1 ('MetaSel ('Just "searchOffsets") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 InspectionOffsets)))

data IntactPlacementLog e Source #

Instances

Instances details
Functor IntactPlacementLog Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

ToJSON e => ToJSON (IntactPlacementLog e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Generic (IntactPlacementLog e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Associated Types

type Rep (IntactPlacementLog e) 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (IntactPlacementLog e) = D1 ('MetaData "IntactPlacementLog" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "IntactPlacementLog" 'PrefixI 'True) (S1 ('MetaSel ('Just "intactnessFailure") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe (StructureIntactnessFailure e))) :*: S1 ('MetaSel ('Just "placedStructure") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PositionedStructure OrientedStructure))))
type Rep (IntactPlacementLog e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (IntactPlacementLog e) = D1 ('MetaData "IntactPlacementLog" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "IntactPlacementLog" 'PrefixI 'True) (S1 ('MetaSel ('Just "intactnessFailure") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe (StructureIntactnessFailure e))) :*: S1 ('MetaSel ('Just "placedStructure") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PositionedStructure OrientedStructure))))

data ChunkMatchFailureReason e Source #

Instances

Instances details
Functor ChunkMatchFailureReason Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

ToJSON e => ToJSON (ChunkMatchFailureReason e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Generic (ChunkMatchFailureReason e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Associated Types

type Rep (ChunkMatchFailureReason e) 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (ChunkMatchFailureReason e) = D1 ('MetaData "ChunkMatchFailureReason" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "ChunkMatchFailureReason" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (NonEmpty StructureName)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (RowMismatchReason e))))
type Rep (ChunkMatchFailureReason e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (ChunkMatchFailureReason e) = D1 ('MetaData "ChunkMatchFailureReason" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "ChunkMatchFailureReason" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (NonEmpty StructureName)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (RowMismatchReason e))))

data FoundChunkComparison e Source #

Instances

Instances details
Functor FoundChunkComparison Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

ToJSON e => ToJSON (FoundChunkComparison e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Generic (FoundChunkComparison e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Associated Types

type Rep (FoundChunkComparison e) 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (FoundChunkComparison e) = D1 ('MetaData "FoundChunkComparison" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "FoundChunkComparison" 'PrefixI 'True) (S1 ('MetaSel ('Just "foundChunkKeys") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [NonEmpty e]) :*: S1 ('MetaSel ('Just "referenceChunkKeys") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [NonEmpty e])))
type Rep (FoundChunkComparison e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (FoundChunkComparison e) = D1 ('MetaData "FoundChunkComparison" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "FoundChunkComparison" 'PrefixI 'True) (S1 ('MetaSel ('Just "foundChunkKeys") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [NonEmpty e]) :*: S1 ('MetaSel ('Just "referenceChunkKeys") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [NonEmpty e])))

data RowMismatchReason e Source #

Constructors

NoKeysSubset (FoundChunkComparison e) 
EmptyIntersection

NOTE: we should never see EmptyIntersection, since the earlier NoKeysSubset condition results in an empty intersection

Instances

Instances details
Functor RowMismatchReason Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

ToJSON e => ToJSON (RowMismatchReason e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Generic (RowMismatchReason e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Associated Types

type Rep (RowMismatchReason e) 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (RowMismatchReason e) = D1 ('MetaData "RowMismatchReason" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "NoKeysSubset" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (FoundChunkComparison e))) :+: C1 ('MetaCons "EmptyIntersection" 'PrefixI 'False) (U1 :: Type -> Type))
type Rep (RowMismatchReason e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (RowMismatchReason e) = D1 ('MetaData "RowMismatchReason" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "NoKeysSubset" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (FoundChunkComparison e))) :+: C1 ('MetaCons "EmptyIntersection" 'PrefixI 'False) (U1 :: Type -> Type))

data SearchLog e Source #

Instances

Instances details
Functor SearchLog Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Methods

fmap :: (a -> b) -> SearchLog a -> SearchLog b #

(<$) :: a -> SearchLog b -> SearchLog a #

ToJSON e => ToJSON (SearchLog e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Generic (SearchLog e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Associated Types

type Rep (SearchLog e) 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (SearchLog e) = D1 ('MetaData "SearchLog" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (((C1 ('MetaCons "IntactStaticPlacement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [IntactPlacementLog e])) :+: (C1 ('MetaCons "StartSearchAt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Cosmic Location)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 InspectionOffsets)) :+: C1 ('MetaCons "FoundParticipatingEntity" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (ParticipatingEntity e))))) :+: (C1 ('MetaCons "FoundCompleteStructureCandidates" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(OrientedStructure, Cosmic Location)])) :+: (C1 ('MetaCons "RecognizedSingleStructure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (OrientedStructure, Cosmic Location))) :+: C1 ('MetaCons "FoundPiecewiseChunks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(NonEmpty Int, NonEmpty e)]))))) :+: ((C1 ('MetaCons "ExpectedChunks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (NonEmpty [NonEmpty e]))) :+: (C1 ('MetaCons "WorldRowContent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Maybe e])) :+: C1 ('MetaCons "ChunksMatchingExpected" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [ChunkedRowMatch (NonEmpty StructureName) e])))) :+: (C1 ('MetaCons "ChunkFailures" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [ChunkMatchFailureReason e])) :+: (C1 ('MetaCons "ChunkIntactnessVerification" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (IntactPlacementLog e))) :+: C1 ('MetaCons "StructureRemoved" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 StructureName))))))

Methods

from :: SearchLog e -> Rep (SearchLog e) x #

to :: Rep (SearchLog e) x -> SearchLog e #

ToSample (SearchLog e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Methods

toSamples :: Proxy (SearchLog e) -> [(Text, SearchLog e)] #

type Rep (SearchLog e) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep (SearchLog e) = D1 ('MetaData "SearchLog" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (((C1 ('MetaCons "IntactStaticPlacement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [IntactPlacementLog e])) :+: (C1 ('MetaCons "StartSearchAt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Cosmic Location)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 InspectionOffsets)) :+: C1 ('MetaCons "FoundParticipatingEntity" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (ParticipatingEntity e))))) :+: (C1 ('MetaCons "FoundCompleteStructureCandidates" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(OrientedStructure, Cosmic Location)])) :+: (C1 ('MetaCons "RecognizedSingleStructure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (OrientedStructure, Cosmic Location))) :+: C1 ('MetaCons "FoundPiecewiseChunks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(NonEmpty Int, NonEmpty e)]))))) :+: ((C1 ('MetaCons "ExpectedChunks" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (NonEmpty [NonEmpty e]))) :+: (C1 ('MetaCons "WorldRowContent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Maybe e])) :+: C1 ('MetaCons "ChunksMatchingExpected" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [ChunkedRowMatch (NonEmpty StructureName) e])))) :+: (C1 ('MetaCons "ChunkFailures" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [ChunkMatchFailureReason e])) :+: (C1 ('MetaCons "ChunkIntactnessVerification" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (IntactPlacementLog e))) :+: C1 ('MetaCons "StructureRemoved" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 StructureName))))))

data StructureLocation Source #

Instances

Instances details
ToJSON StructureLocation Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Generic StructureLocation Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

Associated Types

type Rep StructureLocation 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep StructureLocation = D1 ('MetaData "StructureLocation" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "StructureLocation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 StructureName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Cosmic Location, AbsoluteDir))))
ToSample StructureLocation Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep StructureLocation Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Recognition.Log

type Rep StructureLocation = D1 ('MetaData "StructureLocation" "Swarm.Game.Scenario.Topography.Structure.Recognition.Log" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "StructureLocation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 StructureName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Cosmic Location, AbsoluteDir))))