]> git.rkrishnan.org Git - yorgey.git/commitdiff
initial version of the assignment solution. WIP
authorRamakrishnan Muthukrishnan <ram@rkrishnan.org>
Thu, 25 Dec 2014 09:48:40 +0000 (15:18 +0530)
committerRamakrishnan Muthukrishnan <ram@rkrishnan.org>
Thu, 25 Dec 2014 09:48:40 +0000 (15:18 +0530)
hw7/JoinList.hs
hw7/Scrabble.hs

index 916597e04fc56f1ae31483f5aa13c542976c8ee1..e5633d54bf9f4333cb7b7e2e15e88417e87e43b0 100644 (file)
@@ -1,8 +1,14 @@
 {-# OPTIONS_GHC -Wall #-}
+{-# LANGUAGE FlexibleInstances #-}
+{-# LANGUAGE TypeSynonymInstances #-}
+
 module JoinList where
 
 import Data.Monoid
 import Sized
+import Scrabble
+import Buffer
+import Editor
 
 data JoinList m a = Empty
                   | Single m a
@@ -62,3 +68,46 @@ takeJ n v@(Append t l r) | n > getSize (size t) = v
                                        Append ((tag l) `mappend` (tag rt)) l rt
                          where leftSize = getSize . size . tag $ l
 
+
+-- exercise 3 (Scrabble.hs)
+scoreLine :: String -> JoinList Score String
+scoreLine l = let scores = map scoreString . words $ l
+                  scoresAndWords = zip scores (words l)
+              in
+                foldr (+++) Empty $ map (\(s, w) -> Single s w) scoresAndWords
+
+-- exercise 4
+-- instance (Monoid a, Monoid b) => Monoid (a,b) where
+--   mempty = (mempty, mempty)
+--   (a,b) `mappend` (c,d) = ((a `mappend` c), (b `mappend` d))
+
+
+instance Buffer (JoinList (Score, Size) String) where
+  toString (Empty) = ""
+  toString (Single _ s) = s
+  toString (Append _ l r) = toString l ++ toString r
+
+  fromString s = Single (scoreString s, (Size  (length s))) s
+  line n b = indexJ n b
+  replaceLine n l b = let pre = takeJ (n - 1) b
+                          post = dropJ n b
+                          (Append m1 _ _) = scoreLine l
+                      in
+                       pre +++ (Single (m1, Size (length l)) l) +++ post
+  numLines = \x -> case x of
+                     Empty -> 0
+                     Single _ _ -> 1
+                     Append _ l r -> numLines l + numLines r
+
+  value = \x -> case x of
+                  Empty -> 0
+                  Single (_, m2) _ -> getSize . size $ m2
+                  Append (_, m2) _ _ -> getSize . size $ m2
+
+main = runEditor editor $ Single (Score 244,Size 177) "This buffer is for notes you don't want to save, and for evaluation of steam valve coefficients. To load a different file, type the character L followed by the name of the file."
+--         [ "This buffer is for notes you don't want to save, and for"
+--         , "evaluation of steam valve coefficients."
+--         , "To load a different file, type the character L followed"
+--         , "by the name of the file."
+--         ]
+-- "This buffer is for notes you don't want to save, and for evaluation of steam valve -- coefficients. To load a different file, type the character L followed by the name of the file."
index b2dd38f6ca12822dcfbd351358ee9bd6fbb86467..b08f6af09cc14804d0b0273f280f61f096b81e15 100644 (file)
@@ -1,6 +1,5 @@
 {-# OPTIONS_GHC -Wall #-}
 {-# LANGUAGE GeneralizedNewtypeDeriving #-}
-
 module Scrabble where
 
 import Data.Monoid