License | BSD-3-Clause |
---|---|
Safe Haskell | None |
Language | Haskell2010 |
Swarm.Language.Syntax.CommandMetadata
Description
Command metadata for documentation
Documentation
data SensingType Source #
Constructors
RobotSensing | |
EntitySensing | |
WorldCondition |
Instances
Constructors
Sensing SensingType | empirical knowledge |
PRNG | The random number generator |
APriori | a priori knowledge |
Instances
ToJSON QueryType Source # | |||||
Generic QueryType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Associated Types
| |||||
Show QueryType Source # | |||||
Eq QueryType Source # | |||||
Ord QueryType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata | |||||
type Rep QueryType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata type Rep QueryType = D1 ('MetaData "QueryType" "Swarm.Language.Syntax.CommandMetadata" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-lang" 'False) (C1 ('MetaCons "Sensing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 SensingType)) :+: (C1 ('MetaCons "PRNG" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "APriori" 'PrefixI 'False) (U1 :: Type -> Type))) |
data RobotChangeType Source #
Constructors
PositionChange | |
InventoryChange | |
ExistenceChange | |
BehaviorChange |
Instances
ToJSON RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods toJSON :: RobotChangeType -> Value # toEncoding :: RobotChangeType -> Encoding # toJSONList :: [RobotChangeType] -> Value # toEncodingList :: [RobotChangeType] -> Encoding # omitField :: RobotChangeType -> Bool # | |||||
Bounded RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata | |||||
Enum RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods succ :: RobotChangeType -> RobotChangeType # pred :: RobotChangeType -> RobotChangeType # toEnum :: Int -> RobotChangeType # fromEnum :: RobotChangeType -> Int # enumFrom :: RobotChangeType -> [RobotChangeType] # enumFromThen :: RobotChangeType -> RobotChangeType -> [RobotChangeType] # enumFromTo :: RobotChangeType -> RobotChangeType -> [RobotChangeType] # enumFromThenTo :: RobotChangeType -> RobotChangeType -> RobotChangeType -> [RobotChangeType] # | |||||
Generic RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Associated Types
Methods from :: RobotChangeType -> Rep RobotChangeType x # to :: Rep RobotChangeType x -> RobotChangeType # | |||||
Show RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods showsPrec :: Int -> RobotChangeType -> ShowS # show :: RobotChangeType -> String # showList :: [RobotChangeType] -> ShowS # | |||||
Eq RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods (==) :: RobotChangeType -> RobotChangeType -> Bool # (/=) :: RobotChangeType -> RobotChangeType -> Bool # | |||||
Ord RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods compare :: RobotChangeType -> RobotChangeType -> Ordering # (<) :: RobotChangeType -> RobotChangeType -> Bool # (<=) :: RobotChangeType -> RobotChangeType -> Bool # (>) :: RobotChangeType -> RobotChangeType -> Bool # (>=) :: RobotChangeType -> RobotChangeType -> Bool # max :: RobotChangeType -> RobotChangeType -> RobotChangeType # min :: RobotChangeType -> RobotChangeType -> RobotChangeType # | |||||
type Rep RobotChangeType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata type Rep RobotChangeType = D1 ('MetaData "RobotChangeType" "Swarm.Language.Syntax.CommandMetadata" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-lang" 'False) ((C1 ('MetaCons "PositionChange" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InventoryChange" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ExistenceChange" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BehaviorChange" 'PrefixI 'False) (U1 :: Type -> Type))) |
data MutationType Source #
Constructors
Cosmetic | |
LogEmission | |
EntityChange | |
RobotChange RobotChangeType |
Instances
ToJSON MutationType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods toJSON :: MutationType -> Value # toEncoding :: MutationType -> Encoding # toJSONList :: [MutationType] -> Value # toEncodingList :: [MutationType] -> Encoding # omitField :: MutationType -> Bool # | |||||
Generic MutationType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Associated Types
| |||||
Show MutationType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods showsPrec :: Int -> MutationType -> ShowS # show :: MutationType -> String # showList :: [MutationType] -> ShowS # | |||||
Eq MutationType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata | |||||
Ord MutationType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods compare :: MutationType -> MutationType -> Ordering # (<) :: MutationType -> MutationType -> Bool # (<=) :: MutationType -> MutationType -> Bool # (>) :: MutationType -> MutationType -> Bool # (>=) :: MutationType -> MutationType -> Bool # max :: MutationType -> MutationType -> MutationType # min :: MutationType -> MutationType -> MutationType # | |||||
type Rep MutationType Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata type Rep MutationType = D1 ('MetaData "MutationType" "Swarm.Language.Syntax.CommandMetadata" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-lang" 'False) ((C1 ('MetaCons "Cosmetic" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LogEmission" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "EntityChange" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RobotChange" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 RobotChangeType)))) |
data CommandEffect Source #
Constructors
Query QueryType | |
MetaEffect | |
Mutation MutationType |
Instances
ToJSON CommandEffect Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods toJSON :: CommandEffect -> Value # toEncoding :: CommandEffect -> Encoding # toJSONList :: [CommandEffect] -> Value # toEncodingList :: [CommandEffect] -> Encoding # omitField :: CommandEffect -> Bool # | |||||
Generic CommandEffect Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Associated Types
| |||||
Show CommandEffect Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods showsPrec :: Int -> CommandEffect -> ShowS # show :: CommandEffect -> String # showList :: [CommandEffect] -> ShowS # | |||||
Eq CommandEffect Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods (==) :: CommandEffect -> CommandEffect -> Bool # (/=) :: CommandEffect -> CommandEffect -> Bool # | |||||
Ord CommandEffect Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata Methods compare :: CommandEffect -> CommandEffect -> Ordering # (<) :: CommandEffect -> CommandEffect -> Bool # (<=) :: CommandEffect -> CommandEffect -> Bool # (>) :: CommandEffect -> CommandEffect -> Bool # (>=) :: CommandEffect -> CommandEffect -> Bool # max :: CommandEffect -> CommandEffect -> CommandEffect # min :: CommandEffect -> CommandEffect -> CommandEffect # | |||||
type Rep CommandEffect Source # | |||||
Defined in Swarm.Language.Syntax.CommandMetadata type Rep CommandEffect = D1 ('MetaData "CommandEffect" "Swarm.Language.Syntax.CommandMetadata" "swarm-0.7.0.0-IuFfgHrMoE7JrptOBRVOwx-swarm-lang" 'False) (C1 ('MetaCons "Query" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 QueryType)) :+: (C1 ('MetaCons "MetaEffect" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Mutation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MutationType)))) |