1
1
mirror of https://github.com/github/semantic.git synced 2024-12-29 18:06:14 +03:00

more imports

This commit is contained in:
joshvera 2016-09-16 11:48:58 -04:00
parent 6665f0b6b1
commit 0535744ebc
3 changed files with 3 additions and 5 deletions

View File

@ -3,7 +3,7 @@
module Diff where
import Prologue
import Data.Functor.Foldable as Foldable
import Data.Functor.Foldable as F
import Data.Functor.Both as Both
import Data.Mergeable
import Data.Record
@ -19,8 +19,8 @@ type SyntaxDiff leaf fields = Diff (Syntax leaf) (Record fields)
type instance Base (Free f a) = FreeF f a
instance Functor f => Foldable.Foldable (Free f a) where project = runFree
instance Functor f => Foldable.Unfoldable (Free f a) where embed = free
instance Functor f => F.Foldable (Free f a) where project = runFree
instance Functor f => F.Unfoldable (Free f a) where embed = free
diffSum :: (Prologue.Foldable f, Functor f) => (Patch (Term f annotation) -> Int) -> Diff f annotation -> Int
diffSum patchCost diff = sum $ fmap patchCost diff

View File

@ -5,7 +5,6 @@ import qualified Prologue
import Prologue hiding (fst, snd)
import qualified Data.ByteString.Char8 as B1
import Data.Functor.Both
import Data.Functor.Foldable
import Data.RandomWalkSimilarity
import Data.Record
import qualified Data.Set as Set

View File

@ -2,7 +2,6 @@
module Data.RandomWalkSimilarity.Spec where
import Data.Functor.Both
import Data.Functor.Foldable (cata)
import Data.RandomWalkSimilarity
import Data.Record
import Diff