replace $ with (), and reverse
f $ y 3
f (y 3)
change let to bind, and reverse
{-# LANGUAGE PartialTypeSignatures #-} | |
module Lib | |
( someFunc | |
) where | |
import Diagrams | |
import Diagrams.Prelude | |
import Diagrams.Backend.SVG.CmdLine | |
import Diagrams.Backend.SVG | |
import System.Process |
replace $ with (), and reverse
f $ y 3
f (y 3)
change let to bind, and reverse
{-# LANGUAGE NoMonomorphismRestriction #-} | |
{-# LANGUAGE OverloadedStrings #-} | |
module Data.Yaml.Extended (module Data.Yaml.Extended, lift) where | |
import Data.Yaml | |
import qualified Data.Text as T | |
import Control.Monad.State.Strict (StateT, runStateT, unless, lift, get, modify) | |
import qualified Data.HashMap.Strict as HM (null, delete, keys) | |
import Data.List (intercalate) |
doThing :: (MonadTrans t | |
,MonadFree (MyFreeCache Something) (t m) | |
,MonadFree (MyFreeCache OtherThing) m | |
) |
Pieces you need: | |
* emacs | |
* ghcid | |
ghcid needs to know the height of the terminal, we'll set it explicitly | |
height = (window-height) - (scroll-margin) - 1 | |
set this height as your term-buffer-maximum-size |
{-# LANGUAGE NoMonomorphismRestriction #-} | |
{-# LANGUAGE TemplateHaskell #-} | |
{-# OPTIONS_GHC -fwarn-missing-methods #-} | |
module Err where | |
import Control.Lens | |
import Control.Monad.Error | |
import Control.Monad.Error.Lens | |
-- Here is a fairly typical situation, where we have low level errors in certain |
{-# LANGUAGE ScopedTypeVariables #-} | |
module CrazyIO (module CrazyIO, mmapFileByteString) where | |
import qualified Data.Vector.Storable as V | |
import qualified Data.ByteString as BS | |
import qualified Data.ByteString.Internal as BS | |
import Foreign | |
import System.IO.MMap | |
crazyLoad :: forall a. Storable a => FilePath -> Maybe (Int64, Int) -> IO (V.Vector a) |
{-# LANGUAGE TemplateHaskell #-} | |
{-# LANGUAGE RankNTypes #-} | |
module Val where | |
import Data.Functor.Compose | |
import Control.Applicative | |
-- import Data.Semigroup | |
-- import Data.List.NonEmpty | |
import Control.Lens | |
import Data.Validation |
∴ ghci | |
:iGHCi, version 7.8.3: http://www.haskell.org/ghc/ :? for help | |
Loading package ghc-prim ... linking ... done. | |
Loading package integer-gmp ... linking ... done. | |
Loading package base ... linking ... done. | |
Prelude> :i traverse | |
Top level: | |
Not in scope: ‘traverse’ | |
Perhaps you meant ‘reverse’ (imported from Prelude) |