{-# LANGUAGE OverloadedStrings #-}

-- |
--   Module    : Path.Formatting
--   License   : MIT
--   Stability : experimental
--
-- Formatting for `Path`.
module Path.Formatting
  ( pathf,
  )
where

import Formatting
import Path

-- | Formats any `Path b t`.
--
-- @since 0.1.0.0
pathf :: Format r (Path b t -> r)
pathf :: Format r (Path b t -> r)
pathf = (Path b t -> FilePath)
-> Format r (FilePath -> r) -> Format r (Path b t -> r)
forall a b r t. (a -> b) -> Format r (b -> t) -> Format r (a -> t)
mapf Path b t -> FilePath
forall b t. Path b t -> FilePath
toFilePath Format r (FilePath -> r)
forall r. Format r (FilePath -> r)
string