CapsLock is RCTRL ... i do this on all keyboards
FN CapsLock is RCTRL ... was accidently toggling capslock with fn+capslock
LCTRL is FN ... arrow/pg/home on right half, FN+arrow I now prefer on ALL keyboards... so nice
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 ConstraintKinds, DataKinds, DeriveGeneric, DerivingVia #-} | |
| {-# LANGUAGE ExplicitNamespaces, FlexibleContexts, FlexibleInstances #-} | |
| {-# LANGUAGE GADTs, GeneralizedNewtypeDeriving, MultiParamTypeClasses #-} | |
| {-# LANGUAGE PolyKinds, ScopedTypeVariables, StandaloneDeriving #-} | |
| {-# LANGUAGE TypeApplications, TypeFamilies, TypeInType, TypeOperators #-} | |
| {-# LANGUAGE UndecidableInstances #-} | |
| {-# OPTIONS_GHC -Wall #-} | |
| module Data.Aeson.Generic.DerivingVia | |
| ( StrFun(..), Setting(..), SumEncoding'(..), DefaultOptions, WithOptions(..) | |
| , -- Utility type synonyms to save ticks (') before promoted data constructors |
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
| -- Copyright 2018 Google LLC. | |
| -- SPDX-License-Identifier: Apache-2.0 | |
| {-# LANGUAGE FlexibleContexts #-} | |
| import Control.Applicative | |
| import Control.Monad.Writer | |
| data Expr = Lit Int | Plus Expr Expr | Times Expr Expr | |
| deriving (Eq, Show) |
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
| -- SYSTEM F | |
| -- http://homepages.inf.ed.ac.uk/slindley/papers/embedding-f.pdf | |
| -- | |
| -- Type-level lambdas | |
| -- https://gist.github.com/AndrasKovacs/ac71371d0ca6e0995541e42cd3a3b0cf | |
| {-# language TemplateHaskell, ScopedTypeVariables, RankNTypes, | |
| TypeFamilies, UndecidableInstances, DeriveFunctor, GADTs, | |
| TypeOperators, TypeApplications, AllowAmbiguousTypes, |
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 TypeApplications #-} | |
| {-# LANGUAGE DataKinds #-} | |
| {-# LANGUAGE GADTs #-} | |
| {-# LANGUAGE DeriveGeneric #-} | |
| {-# LANGUAGE TemplateHaskell #-} | |
| {-# LANGUAGE ScopedTypeVariables #-} | |
| {-# LANGUAGE RankNTypes #-} | |
| module LMS where | |
| import Data.Generics.Product |
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
| -- http://comonad.com/reader/2018/the-state-comonad/ | |
| -- https://www.reddit.com/r/haskell/comments/7oav51/i_made_a_monad_that_i_havent_seen_before_and_i/ | |
| {-# language DeriveFunctor #-} | |
| import Control.Comonad | |
| import Data.Semigroup | |
| data Store s a = Store { peek :: s -> a, pos :: s } deriving Functor |
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 TypeInType, GADTs, TemplateHaskell, ExistentialQuantification, | |
| TypeApplications, TypeFamilies, TypeOperators, StandaloneDeriving, FlexibleContexts, | |
| RankNTypes #-} | |
| import Data.Kind | |
| import Data.Singletons | |
| import Data.Singletons.TH | |
| data Sigma a f = forall (x :: a). Sigma (Sing x) (Apply f x) |