-- |Path combinators.
module Ribosome.Host.Path where

import Path (Path, toFilePath)

-- |Render a 'Path' as 'Text'.
pathText ::
  Path b t ->
  Text
pathText :: forall b t. Path b t -> Text
pathText =
  FilePath -> Text
forall a. ToText a => a -> Text
toText (FilePath -> Text) -> (Path b t -> FilePath) -> Path b t -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Path b t -> FilePath
forall b t. Path b t -> FilePath
toFilePath