Skip to content

Commit

Permalink
change Data.NumInstances import in Diagrams.TwoD.Types (see #48)
Browse files Browse the repository at this point in the history
  • Loading branch information
Brent Yorgey committed Mar 21, 2013
1 parent 6d91d34 commit 6349cf2
Showing 1 changed file with 16 additions and 16 deletions.
32 changes: 16 additions & 16 deletions src/Diagrams/TwoD/Types.hs
Original file line number Diff line number Diff line change
@@ -1,11 +1,11 @@
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeSynonymInstances #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE ViewPatterns #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE TypeSynonymInstances #-}
{-# LANGUAGE ViewPatterns #-}

{-# OPTIONS_GHC -fno-warn-orphans #-}
-----------------------------------------------------------------------------
Expand All @@ -31,17 +31,17 @@ module Diagrams.TwoD.Types
, fullCircle, convertAngle
) where

import Diagrams.Coordinates
import Diagrams.Util (tau)
import Diagrams.Core
import Diagrams.Coordinates
import Diagrams.Core
import Diagrams.Util (tau)

import Control.Newtype
import Control.Newtype

import Data.Basis
import Data.NumInstances ()
import Data.VectorSpace
import Data.Basis
import Data.NumInstances.Tuple ()
import Data.VectorSpace

import Data.Typeable
import Data.Typeable

------------------------------------------------------------
-- 2D Euclidean space
Expand Down Expand Up @@ -203,4 +203,4 @@ fullCircle = fromCircleFrac 1

-- | Convert between two angle representations.
convertAngle :: (Angle a, Angle b) => a -> b
convertAngle = fromCircleFrac . toCircleFrac
convertAngle = fromCircleFrac . toCircleFrac

0 comments on commit 6349cf2

Please sign in to comment.