{-# LANGUAGE OverloadedStrings #-}

module Hledger.Flow.DocHelpers where

import qualified Data.Text as T (Text)
import qualified Turtle as Turtle (Line, format, l)
import Turtle ((%))

docURL :: Turtle.Line -> T.Text
docURL :: Line -> Text
docURL = Format Text (Line -> Text) -> Line -> Text
forall r. Format Text r -> r
Turtle.format (Format (Line -> Text) (Line -> Text)
"https://github.com/apauley/hledger-flow#"Format (Line -> Text) (Line -> Text)
-> Format Text (Line -> Text) -> Format Text (Line -> Text)
forall b c a. Format b c -> Format a b -> Format a c
%Format Text (Line -> Text)
forall r. Format r (Line -> r)
Turtle.l)