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

Swarm.Game.Scenario.Topography.Structure.Named

Description

 

Documentation

newtype StructureName Source #

Constructors

StructureName Text 

Instances

Instances details
FromJSON StructureName Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

ToJSON StructureName Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Generic StructureName Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Associated Types

type Rep StructureName 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

type Rep StructureName = D1 ('MetaData "StructureName" "Swarm.Game.Scenario.Topography.Structure.Named" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'True) (C1 ('MetaCons "StructureName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
Show StructureName Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Eq StructureName Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Ord StructureName Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

type Rep StructureName Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

type Rep StructureName = D1 ('MetaData "StructureName" "Swarm.Game.Scenario.Topography.Structure.Named" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-topography" 'True) (C1 ('MetaCons "StructureName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data NamedArea a Source #

Constructors

NamedArea 

Fields

  • name :: StructureName
     
  • recognize :: Set AbsoluteDir

    whether this structure should be registered for automatic recognition and which orientations shall be recognized. The supplied direction indicates which cardinal direction the original map's North has been re-oriented to. E.g., DWest represents a rotation of 90 degrees counter-clockwise.

  • description :: Maybe Text

    will be UI-facing only if this is a recognizable structure

  • structure :: a
     

Instances

Instances details
Foldable NamedArea Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Methods

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

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

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

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

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

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

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

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

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

toList :: NamedArea a -> [a] #

null :: NamedArea a -> Bool #

length :: NamedArea a -> Int #

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

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

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

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

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

Traversable NamedArea Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Methods

traverse :: Applicative f => (a -> f b) -> NamedArea a -> f (NamedArea b) #

sequenceA :: Applicative f => NamedArea (f a) -> f (NamedArea a) #

mapM :: Monad m => (a -> m b) -> NamedArea a -> m (NamedArea b) #

sequence :: Monad m => NamedArea (m a) -> m (NamedArea a) #

Functor NamedArea Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Methods

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

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

FromJSONE e a => FromJSONE e (NamedStructure (Maybe a)) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure

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

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Eq a => Eq (NamedArea a) Source # 
Instance details

Defined in Swarm.Game.Scenario.Topography.Structure.Named

Methods

(==) :: NamedArea a -> NamedArea a -> Bool #

(/=) :: NamedArea a -> NamedArea a -> Bool #