{-# LANGUAGE FlexibleInstances    #-}
{-# LANGUAGE OverloadedStrings    #-}
{-# LANGUAGE StandaloneDeriving   #-}
{-# LANGUAGE TypeSynonymInstances #-}
module PaymentChannel.Internal.Serialization
(
  module PaymentChannel.Internal.Serialization.Orphans
) where

import           PaymentChannel.Internal.Serialization.Orphans ()