module Game.LambdaHack.Client.UI.ContentClientUI
( CCUI(..), emptyCCUI
) where
import Prelude ()
import qualified Data.EnumMap.Strict as EM
import qualified Data.Map.Strict as M
import Game.LambdaHack.Client.UI.Content.Input
import Game.LambdaHack.Client.UI.Content.Screen
data CCUI = CCUI
{ CCUI -> InputContent
coinput :: InputContent
, CCUI -> ScreenContent
coscreen :: ScreenContent
}
emptyCCUI :: CCUI
emptyCCUI :: CCUI
emptyCCUI = CCUI :: InputContent -> ScreenContent -> CCUI
CCUI
{ coinput :: InputContent
coinput = Map KM CmdTriple
-> [(KM, CmdTriple)] -> Map HumanCmd [KM] -> InputContent
InputContent Map KM CmdTriple
forall k a. Map k a
M.empty [] Map HumanCmd [KM]
forall k a. Map k a
M.empty
, coscreen :: ScreenContent
coscreen = ScreenContent :: X
-> X
-> String
-> ([String], [[String]])
-> EnumMap (ContentSymbol ItemKind) Text
-> [(String, ByteString)]
-> ScreenContent
ScreenContent { rwidth :: X
rwidth = X
0
, rheight :: X
rheight = X
0
, rwebAddress :: String
rwebAddress = String
""
, rintroScreen :: ([String], [[String]])
rintroScreen = ([], [])
, rapplyVerbMap :: EnumMap (ContentSymbol ItemKind) Text
rapplyVerbMap = EnumMap (ContentSymbol ItemKind) Text
forall k a. EnumMap k a
EM.empty
, rFontFiles :: [(String, ByteString)]
rFontFiles = []
}
}