LambdaHack-0.11.0.0: A game engine library for tactical squad ASCII roguelike dungeon crawlers
Safe HaskellNone
LanguageHaskell2010

Game.LambdaHack.Common.Analytics

Description

Per-actor analytics of personal feats.

Synopsis

Documentation

type FactionAnalytics = EnumMap FactionId Analytics Source #

Summary analytics data for each faction.

type ActorAnalytics = EnumMap ActorId Analytics Source #

Analytics data for each live actor.

type GenerationAnalytics = EnumMap SLore (EnumMap ItemId Int) Source #

Statistics of possible and actual generation of items for each lore kind.

newtype Analytics Source #

Statistics of past events concerning an actor.

Constructors

Analytics 

Instances

Instances details
Eq Analytics Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

Show Analytics Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

Binary Analytics Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

data KillHow Source #

Labels of individual kill count analytics.

Instances

Instances details
Enum KillHow Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

Eq KillHow Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

Methods

(==) :: KillHow -> KillHow -> Bool #

(/=) :: KillHow -> KillHow -> Bool #

Show KillHow Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

Generic KillHow Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

Associated Types

type Rep KillHow :: Type -> Type #

Methods

from :: KillHow -> Rep KillHow x #

to :: Rep KillHow x -> KillHow #

Binary KillHow Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

Methods

put :: KillHow -> Put #

get :: Get KillHow #

putList :: [KillHow] -> Put #

type Rep KillHow Source # 
Instance details

Defined in Game.LambdaHack.Common.Analytics

type Rep KillHow = D1 ('MetaData "KillHow" "Game.LambdaHack.Common.Analytics" "LambdaHack-0.11.0.0-inplace" 'False) (((C1 ('MetaCons "KillKineticMelee" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KillKineticRanged" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KillKineticBlast" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "KillKineticPush" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KillOtherMelee" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KillOtherRanged" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "KillOtherBlast" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KillOtherPush" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KillActorLaunch" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "KillTileLaunch" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KillDropLaunch" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KillCatch" 'PrefixI 'False) (U1 :: Type -> Type)))))

Internal operations