{-# LANGUAGE TemplateHaskell #-}

module Taskell.Config where

import ClassyPrelude

import           Data.FileEmbed             (embedFile)
import           Data.Version               (showVersion)
import           Language.Haskell.TH.Syntax (liftString)
import qualified Paths_taskell              (version)

version :: Text
version :: Text
version = $(liftString $ showVersion Paths_taskell.version)

trelloUsage :: Text
trelloUsage :: Text
trelloUsage = ByteString -> Text
forall textual binary. Utf8 textual binary => binary -> textual
decodeUtf8 $(embedFile "templates/trello-token.txt")

githubUsage :: Text
githubUsage :: Text
githubUsage = ByteString -> Text
forall textual binary. Utf8 textual binary => binary -> textual
decodeUtf8 $(embedFile "templates/github-token.txt")

usage :: Text
usage :: Text
usage = ByteString -> Text
forall textual binary. Utf8 textual binary => binary -> textual
decodeUtf8 $(embedFile "templates/usage.txt")