{-# LANGUAGE OverloadedStrings #-}
module Swarm.TUI.View.Shared where
import Brick
import Brick.Widgets.Center (hCenter)
import Swarm.TUI.View.Attribute.Attr (italicAttr)
tabControlFooter :: Widget n
= Widget n -> Widget n
forall n. Widget n -> Widget n
hCenter (Widget n -> Widget n) -> Widget n -> Widget n
forall a b. (a -> b) -> a -> b
$ AttrName -> Widget n -> Widget n
forall n. AttrName -> Widget n -> Widget n
withAttr AttrName
italicAttr (Widget n -> Widget n) -> Widget n -> Widget n
forall a b. (a -> b) -> a -> b
$ Text -> Widget n
forall n. Text -> Widget n
txt Text
"NOTE: [Tab] toggles focus between panes"