module Taskell.IO.Config.Parser where

import ClassyPrelude

import Data.Text as T (dropAround, strip)

noEmpty :: Text -> Maybe Text
noEmpty :: Text -> Maybe Text
noEmpty Text
""  = Maybe Text
forall a. Maybe a
Nothing
noEmpty Text
txt = Text -> Maybe Text
forall a. a -> Maybe a
Just Text
txt

parseText :: Text -> Text
parseText :: Text -> Text
parseText = (Char -> Bool) -> Text -> Text
dropAround (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
== Char
'"') (Text -> Text) -> (Text -> Text) -> Text -> Text
forall k (cat :: k -> k -> *) (b :: k) (c :: k) (a :: k).
Category cat =>
cat b c -> cat a b -> cat a c
. Text -> Text
strip