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
-------------------------------------------------- | |
-- Yoneda lemma | |
newtype Yoneda f a = | |
Yoneda (forall b. (a -> b) -> f b) | |
-- Nat (Hom(a, -), F) ~~ F a | |
-- this is `liftYoneda` | |
yoneda :: (Functor f) => f a -> Yoneda f a | |
yoneda x = Yoneda $ \f -> fmap f x |
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 TypeFamilies, FlexibleInstances #-} | |
module SeqFoldable where | |
import Prelude hiding (drop, take) | |
import Data.Functor.Foldable | |
import Data.Sequence (Seq, ViewL (..), (<|)) | |
import qualified Data.Sequence as S | |
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
# | |
# This simple script displays whether you are in a cabal sandbox | |
# the the result of checking for a sandbox is cached, but now that I | |
# actually think about it, it was probably an unnecessary step. | |
# Don't forget to customize the PROMPT variable at the bottom | |
# | |
# Looks like this with my prompt: https://files.app.net/rjphjAG9.png | |
# | |
function update_cabal_sandbox_info () { |
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
Resolving dependencies... | |
Configuring diagrams-contrib-1.0.0.1... | |
Building diagrams-contrib-1.0.0.1... | |
Preprocessing library diagrams-contrib-1.0.0.1... | |
src/Diagrams/TwoD/Tilings.hs:94:39: | |
warning: missing terminating ' character [-Winvalid-pp-token] | |
-- Instead of using Doubles, which can't be compared for equality, it | |
^ |
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 TypeFamilies, | |
MultiParamTypeClasses, | |
FlexibleInstances, | |
UndecidableInstances, | |
FunctionalDependencies #-} | |
import Control.Concurrent | |
import Control.Monad | |
import Control.Monad.Fix | |
import JavaScript.JQuery |
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
/* FNV-1 hash | |
* | |
* The FNV-1 hash description: http://isthe.com/chongo/tech/comp/fnv/ | |
* The FNV-1 hash is public domain: http://isthe.com/chongo/tech/comp/fnv/#public_domain | |
long hashable_fnv_hash(const unsigned char* str, long len, long hash) { | |
while (len--) { | |
hash = (hash * 16777619) ^ *str++; | |
} |
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
> modifyMatch :: LMatch RdrName (LHsExpr RdrName) | |
> -> LMatch RdrName (LHsExpr RdrName) | |
> modifyMatch (L l1 (Match lpat lty rs@(GRHSs{..}))) = | |
> let f (L l1 (GRHS guards body)) = | |
> L l1 (GRHS guards (modifyExpr body)) | |
> in L l1 (Match lpat lty (rs | |
> { grhssGRHSs = map f grhssGRHSs })) |
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
instance (a ~ D.SVG, b ~ D.R2, c ~ Any) => Display (D.QDiagram a b c) where | |
instance Display (D.QDiagram D.SVG D.R2 Any) where |
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
src/Diagrams/Trail.hs:150:1: | |
Can't make a derived instance of `Transformable (SegTree v)' | |
(even with cunning newtype deriving): | |
it is not type-safe to use GeneralizedNewtypeDeriving on this class; | |
the last parameter of `Transformable' is at role N | |
In the stand-alone deriving instance for | |
`(HasLinearMap v, InnerSpace v, OrderedField (Scalar v)) => | |
Transformable (SegTree v)' |
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
match "gallery/*.lhs" $ version "gallery" $ do | |
route $ setExtension "html" | |
compile $ do | |
getResourceBody >>= saveSnapshot "rawcontent" | |
withMathJax | |
>>= loadAndApplyTemplate "templates/exampleHi.html" | |
( mconcat | |
[ field "code" readSource | |
, setImgURL | |
, setHtmlURL |