module Panda.View.Widget.Header where
  
import Panda.Helper.Env hiding (header)
import Prelude hiding ((.), (/), (^), id, span)
import qualified Panda.Config.Global as G
import Panda.View.Widget.SearchBar

header c state =
  div_class_id c "header" << 
    [ search_bar
    , site_name
    ]

site_name = toHtml $
  [ toHtml $ hotlink G.root ! [theclass "logo"] << ""
  , h1 << G.blog_title
  , div_class "description" << G.blog_subtitle
  ]