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

Swarm.Game.Scenario.Topography.Structure.Recognition.Static

Description

 
Synopsis

Documentation

data RotationalSymmetry Source #

Constructors

NoSymmetry

Aka 1-fold symmetry

TwoFold

Equivalent under rotation by 180 degrees

FourFold

Equivalent under rotation by 90 degrees

data SymmetryAnnotatedGrid a Source #

Instances

Instances details
Foldable SymmetryAnnotatedGrid Source # 
Instance details

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

Methods

fold :: Monoid m => SymmetryAnnotatedGrid m -> m #

foldMap :: Monoid m => (a -> m) -> SymmetryAnnotatedGrid a -> m #

foldMap' :: Monoid m => (a -> m) -> SymmetryAnnotatedGrid a -> m #

foldr :: (a -> b -> b) -> b -> SymmetryAnnotatedGrid a -> b #

foldr' :: (a -> b -> b) -> b -> SymmetryAnnotatedGrid a -> b #

foldl :: (b -> a -> b) -> b -> SymmetryAnnotatedGrid a -> b #

foldl' :: (b -> a -> b) -> b -> SymmetryAnnotatedGrid a -> b #

foldr1 :: (a -> a -> a) -> SymmetryAnnotatedGrid a -> a #

foldl1 :: (a -> a -> a) -> SymmetryAnnotatedGrid a -> a #

toList :: SymmetryAnnotatedGrid a -> [a] #

null :: SymmetryAnnotatedGrid a -> Bool #

length :: SymmetryAnnotatedGrid a -> Int #

elem :: Eq a => a -> SymmetryAnnotatedGrid a -> Bool #

maximum :: Ord a => SymmetryAnnotatedGrid a -> a #

minimum :: Ord a => SymmetryAnnotatedGrid a -> a #

sum :: Num a => SymmetryAnnotatedGrid a -> a #

product :: Num a => SymmetryAnnotatedGrid a -> a #

Traversable SymmetryAnnotatedGrid Source # 
Instance details

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

Functor SymmetryAnnotatedGrid Source # 
Instance details

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

Show a => Show (SymmetryAnnotatedGrid a) Source # 
Instance details

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

data OrientedStructure Source #

Instances

Instances details
ToJSON OrientedStructure Source # 
Instance details

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

Generic OrientedStructure Source # 
Instance details

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

Associated Types

type Rep OrientedStructure 
Instance details

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

type Rep OrientedStructure = D1 ('MetaData "OrientedStructure" "Swarm.Game.Scenario.Topography.Structure.Recognition.Static" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "OrientedStructure" 'PrefixI 'True) (S1 ('MetaSel ('Just "oName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 StructureName) :*: S1 ('MetaSel ('Just "oDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AbsoluteDir)))
Show OrientedStructure Source # 
Instance details

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

Eq OrientedStructure Source # 
Instance details

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

Ord OrientedStructure Source # 
Instance details

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

Ord (PositionedStructure OrientedStructure) Source # 
Instance details

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

type Rep OrientedStructure Source # 
Instance details

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

type Rep OrientedStructure = D1 ('MetaData "OrientedStructure" "Swarm.Game.Scenario.Topography.Structure.Recognition.Static" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'False) (C1 ('MetaCons "OrientedStructure" 'PrefixI 'True) (S1 ('MetaSel ('Just "oName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 StructureName) :*: S1 ('MetaSel ('Just "oDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 AbsoluteDir)))