Safe Haskell | None |
---|---|
Language | Haskell2010 |
Game.LambdaHack.Definition.Defs
Description
Basic types for content definitions.
Synopsis
- data GroupName c
- displayGroupName :: GroupName c -> Text
- data ContentId c
- contentIdIndex :: ContentId c -> Int
- type ContentSymbol c = Char
- displayContentSymbol :: ContentSymbol c -> Char
- type X = Int
- type Y = Int
- type Freqs c = [(GroupName c, Int)]
- renameFreqs :: (Text -> Text) -> Freqs c -> Freqs c
- type Rarity = [(Double, Int)]
- linearInterpolation :: Int -> Int -> Rarity -> Int
- data CStore
- ppCStore :: CStore -> (Text, Text)
- ppCStoreIn :: CStore -> Text
- verbCStore :: CStore -> Text
- data SLore
- data ItemDialogMode
- ppSLore :: SLore -> Text
- headingSLore :: SLore -> Text
- ppItemDialogMode :: ItemDialogMode -> (Text, Text)
- ppItemDialogModeIn :: ItemDialogMode -> Text
- ppItemDialogModeFrom :: ItemDialogMode -> Text
- loreFromMode :: ItemDialogMode -> SLore
- data Direction
Documentation
Instances
Eq (GroupName c) Source # | |
Ord (GroupName c) Source # | |
Defined in Game.LambdaHack.Definition.DefsInternal | |
Show (GroupName c) Source # | |
Binary (GroupName c) Source # | |
NFData (GroupName c) Source # | |
Defined in Game.LambdaHack.Definition.DefsInternal | |
Hashable (GroupName c) Source # | |
Defined in Game.LambdaHack.Definition.DefsInternal |
displayGroupName :: GroupName c -> Text Source #
This does not need to be 1-1, so should not be used in place of the
Eq
instance, etc.
Content identifiers for the content type c
.
Instances
Enum (ContentId c) Source # | |
Defined in Game.LambdaHack.Definition.DefsInternal Methods succ :: ContentId c -> ContentId c # pred :: ContentId c -> ContentId c # toEnum :: Int -> ContentId c # fromEnum :: ContentId c -> Int # enumFrom :: ContentId c -> [ContentId c] # enumFromThen :: ContentId c -> ContentId c -> [ContentId c] # enumFromTo :: ContentId c -> ContentId c -> [ContentId c] # enumFromThenTo :: ContentId c -> ContentId c -> ContentId c -> [ContentId c] # | |
Eq (ContentId c) Source # | |
Ord (ContentId c) Source # | |
Defined in Game.LambdaHack.Definition.DefsInternal | |
Show (ContentId c) Source # | |
Binary (ContentId c) Source # | |
Hashable (ContentId c) Source # | |
Defined in Game.LambdaHack.Definition.DefsInternal | |
UnboxRepClass (ContentId k) Source # | |
type UnboxRep (ContentId k) Source # | |
Defined in Game.LambdaHack.Common.PointArray |
contentIdIndex :: ContentId c -> Int Source #
type ContentSymbol c = Char Source #
displayContentSymbol :: ContentSymbol c -> Char Source #
type Freqs c = [(GroupName c, Int)] Source #
For each group that the kind belongs to, denoted by a GroupName
in the first component of a pair, the second component of a pair shows
how common the kind is within the group.
type Rarity = [(Double, Int)] Source #
Rarity on given depths. The first element of the pair is normally in (0, 10] interval and, e.g., if there are 20 levels, 0.5 represents the first level and 10 the last. Exceptionally, it may be larger than 10, meaning appearance in the dungeon is not possible under normal circumstances and the value remains constant above the interval bound.
Actor's item stores.
Instances
Bounded CStore Source # | |
Enum CStore Source # | |
Defined in Game.LambdaHack.Definition.Defs | |
Eq CStore Source # | |
Ord CStore Source # | |
Read CStore Source # | |
Show CStore Source # | |
Generic CStore Source # | |
Binary CStore Source # | |
NFData CStore Source # | |
Defined in Game.LambdaHack.Definition.Defs | |
type Rep CStore Source # | |
Defined in Game.LambdaHack.Definition.Defs type Rep CStore = D1 ('MetaData "CStore" "Game.LambdaHack.Definition.Defs" "LambdaHack-0.11.0.0-inplace" 'False) ((C1 ('MetaCons "CGround" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "COrgan" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CEqp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CStash" 'PrefixI 'False) (U1 :: Type -> Type))) |
ppCStoreIn :: CStore -> Text Source #
verbCStore :: CStore -> Text Source #
Item slot and lore categories.
Instances
Bounded SLore Source # | |
Enum SLore Source # | |
Defined in Game.LambdaHack.Definition.Defs | |
Eq SLore Source # | |
Ord SLore Source # | |
Read SLore Source # | |
Show SLore Source # | |
Generic SLore Source # | |
Binary SLore Source # | |
NFData SLore Source # | |
Defined in Game.LambdaHack.Definition.Defs | |
type Rep SLore Source # | |
Defined in Game.LambdaHack.Definition.Defs type Rep SLore = D1 ('MetaData "SLore" "Game.LambdaHack.Definition.Defs" "LambdaHack-0.11.0.0-inplace" 'False) ((C1 ('MetaCons "SItem" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SOrgan" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "STrunk" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "SCondition" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SBlast" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "SEmbed" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SBody" 'PrefixI 'False) (U1 :: Type -> Type)))) |
data ItemDialogMode Source #
Constructors
MStore CStore | a leader's store |
MOwned | all party's items |
MSkills | not items, but determined by leader's items |
MLore SLore | not party's items, but all known generalized items |
MPlaces | places; not items at all, but definitely a lore |
MFactions | factions in this game, with some data from previous |
MModes | scenarios; not items at all, but definitely a lore |
Instances
headingSLore :: SLore -> Text Source #
ppItemDialogMode :: ItemDialogMode -> (Text, Text) Source #
loreFromMode :: ItemDialogMode -> SLore Source #