This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE GeneralizedNewtypeDeriving #-} | |
import Control.Applicative | |
import Control.Monad.Trans.State.Strict | |
import Control.Monad.Trans.Class | |
import Control.Monad.Morph | |
import Data.Monoid | |
newtype MonoidState m a = MonoidState { st :: StateT [Int] m a } | |
deriving (Functor, Applicative, Monad, MonadTrans, MFunctor) |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE ExistentialQuantification #-} | |
import Control.Monad.Error | |
import Control.Monad.Trans.State.Strict | |
import Data.Time.Clock | |
import Pipes | |
import qualified Pipes.Prelude as P | |
import qualified Pipes.Lift as P | |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
#!/bin/bash | |
REPOS=$(dirname $(pwd)) | |
echo_color() { | |
local t=$1 | |
INFO='\033[1;33m' | |
NC='\033[0m' | |
echo -e "${INFO}$t${NC}" | |
} |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
#!/bin/bash | |
DEV_DIR=$1 | |
REPOS=("package1" "package2") | |
RED='\033[1;33m' | |
BLUE='\033[1;31m' | |
NC='\033[0m' | |
if [[ -z $DEV_DIR ]] |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE GADTs, DataKinds, KindSignatures, TemplateHaskell, QuasiQuotes #-} | |
module Foo (bar, Foo(..), SBool(..)) | |
where | |
import Language.Haskell.TH | |
data SBool b where | |
STrue :: SBool True | |
SFalse :: SBool False |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
module Foo where | |
import Data.List | |
import Data.Ord | |
import Debug.Trace | |
-- | A binary relation. | |
type Rel a = a -> a -> Bool | |
type Dom a = [a] |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE TupleSections, FlexibleInstances #-} | |
-- Manipulate graphs for metadata generation | |
-- WARNING: everything in here is REALLY REALLY REALLY SLOW | |
-- | |
module Snail | |
( Rel(..) | |
, fromList, toList | |
, allR, differenceR, unionR, composeR, transitiveR | |
, transClosure |
NewerOlder