So we're given the task of determining whether a given integer is a palindrome in base 10.
Seems easy enough:
isPalindrome :: Integer -> Bool
isPalindrome n = show n == reverse (show n)
Done. That was a short article.
fizzbuzz: depinjex.c main.c | |
gcc -o $@ $^ | |
fizzbuzz-test: depinjex.c test.c | |
gcc -DENABLE_DEPENDENCY_INJECTION -o $@ $^ | |
test: fizzbuzz-test | |
./$^ | |
clean: |
{-# LANGUAGE KindSignatures #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE TypeOperators #-} | |
{-# LANGUAGE DataKinds #-} | |
{-# LANGUAGE GADTs #-} | |
{-# LANGUAGE PolyKinds #-} | |
{-# LANGUAGE RankNTypes #-} | |
module Cascade where | |
import Control.Category | |
import Control.Comonad |
So we're given the task of determining whether a given integer is a palindrome in base 10.
Seems easy enough:
isPalindrome :: Integer -> Bool
isPalindrome n = show n == reverse (show n)
Done. That was a short article.
<!doctype html> | |
<html lang="en" dir="ltr"> | |
<head> | |
<meta charset="UTF-8"> | |
</head> | |
<body> | |
</body> | |
</html> |
{-# LANGUAGE FlexibleContexts #-} -- {{{ | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE PackageImports #-} | |
{-# LANGUAGE PolyKinds #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE TypeOperators #-} | |
{-# LANGUAGE TypeSynonymInstances #-} | |
{-# LANGUAGE UndecidableInstances #-} -- }}} | |
module FunctorFun where | |
-- {{{ |
{-# LANGUAGE GADTs #-} | |
{-# LANGUAGE MultiParamTypeClasses #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE LambdaCase #-} | |
module SO25311781 where | |
import Data.Generics.Uniplate.Direct | |
data Expression a where | |
I :: Int -> Expression Int |
{-# LANGUAGE MultiParamTypeClasses #-} | |
{-# LANGUAGE PolyKinds #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE ConstraintKinds #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE KindSignatures #-} | |
{-# LANGUAGE RankNTypes #-} | |
{-# LANGUAGE UndecidableInstances #-} | |
{-# LANGUAGE ScopedTypeVariables #-} |
{-# LANGUAGE MultiParamTypeClasses #-} | |
{-# LANGUAGE PolyKinds #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE ConstraintKinds #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE KindSignatures #-} | |
{-# LANGUAGE RankNTypes #-} | |
{-# LANGUAGE UndecidableInstances #-} | |
{-# LANGUAGE ScopedTypeVariables #-} |
{-# LANGUAGE DataKinds #-} | |
{-# LANGUAGE KindSignatures #-} | |
{-# LANGUAGE GADTs #-} | |
{-# LANGUAGE TypeFamilies #-} | |
{-# LANGUAGE TypeOperators #-} | |
{-# LANGUAGE PolyKinds #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE UndecidableInstances #-} | |
{-# LANGUAGE DeriveFunctor #-} | |
module Unique ( |
Scenes:
The City Gate:
The caravan gets ready to leave in the square next to the city gate, giving the characters a chance to make themselves known to each other.
Criers call out news.