Skip to content
Snippets Groups Projects
Commit 78a19a58 authored by Vaibhav Sagar's avatar Vaibhav Sagar
Browse files

Cabal.Distribution.Compiler: add Functor, Foldable, and Traversable instances for PerCompilerFlavor

parent 10051c3c
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DeriveFunctor #-}
{-# LANGUAGE DeriveFoldable #-}
{-# LANGUAGE DeriveTraversable #-}
-----------------------------------------------------------------------------
-- |
......@@ -122,7 +125,8 @@ defaultCompilerFlavor = case buildCompilerFlavor of
-- Cabal parses only @ghc-options@ and @ghcjs-options@, others are omitted.
--
data PerCompilerFlavor v = PerCompilerFlavor v v
deriving (Generic, Show, Read, Eq, Typeable, Data)
deriving (Generic, Show, Read, Eq, Typeable, Data, Functor, Foldable
, Traversable)
instance Binary a => Binary (PerCompilerFlavor a)
instance Structured a => Structured (PerCompilerFlavor a)
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment