{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
module Headroom.Meta
( TemplateType
, buildVersion
, productDesc
, productInfo
, productName
, website
)
where
import Data.Version ( showVersion )
import Headroom.Template.Mustache ( Mustache )
import Paths_headroom ( version )
import RIO
import qualified RIO.Text as T
type TemplateType = Mustache
buildVersion :: Text
buildVersion :: Text
buildVersion = String -> Text
T.pack (String -> Text) -> (Version -> String) -> Version -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Version -> String
showVersion (Version -> Text) -> Version -> Text
forall a b. (a -> b) -> a -> b
$ Version
version
productDesc :: Text
productDesc :: Text
productDesc = Text
"manage your source code license headers"
productInfo :: Text
productInfo :: Text
productInfo = [Text] -> Text
forall a. Monoid a => [a] -> a
mconcat [Text
productName, Text
", v", Text
buildVersion, Text
" :: ", Text
website]
productName :: Text
productName :: Text
productName = Text
"headroom"
website :: Text
website :: Text
website = Text
"https://github.com/vaclavsvejcar/headroom"