{- |
   Module     : Path.Dhall
   License    : MIT
   Stability  : experimental

Binary instance for `Path`.
-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
{-# LANGUAGE FlexibleInstances  #-}
module Path.Dhall where

import Dhall
import Path

instance FromDhall (Path Rel File)
instance FromDhall (Path Rel Dir)
instance ToDhall (Path Rel File)
instance ToDhall (Path Rel Dir)