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 Handler.Root where | |
import Import | |
-- This is a handler function for the GET request method on the RootR | |
-- resource pattern. All of your resource patterns are defined in | |
-- config/routes | |
-- | |
-- The majority of the code you will write in Yesod lives in these handler | |
-- functions. You can spread them across multiple files if you are so |
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
#!/usr/bin/env runhaskell | |
module Main where | |
import System.Process | |
import System.Environment | |
import Distribution.Simple.GHC | |
import Distribution.Verbosity | |
import Data.List (nub, isPrefixOf) | |
import Distribution.Simple.PackageIndex | |
import Distribution.InstalledPackageInfo |
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
/* | |
StgRec [ | |
( Main.listAppend,StgRhsClosure CostCentreStack StgBinderInfo [] ReEntrant SRT [ds,l2] | |
( StgCase | |
( StgApp ds [] | |
) | |
UniqSet UniqSet wild SRT Alg Main.List [ | |
( DataAlt Main.Cons,[a,l1],[True,True],StgLet | |
( StgNonRec sat_s1Pj | |
( StgRhsClosure CostCentreStack StgBinderInfo [l1,l2] Updatable SRT [] |
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
/* | |
StgRec [ | |
( Fibs.$wfib,StgRhsClosure CostCentreStack StgBinderInfo [] ReEntrant SRT [ww] | |
( StgCase | |
( StgApp ww [] | |
) | |
UniqSet UniqSet ds SRT Prim GHC.Prim.Int# [ | |
( DEFAULT,[],[],StgCase | |
( StgOpApp | |
( StgPrimOp IntSubOp |
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
/* | |
StgRec [ | |
( Main.listAppend,StgRhsClosure CostCentreStack StgBinderInfo [] ReEntrant SRT [ds,l2] | |
( StgCase | |
( StgApp ds [] | |
) | |
UniqSet UniqSet wild SRT Alg Main.List [ | |
( DataAlt Main.Cons,[a,l1],[True,True],StgLet | |
( StgNonRec sat_s1OT | |
( StgRhsClosure CostCentreStack StgBinderInfo [l1,l2] Updatable SRT [] |
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
/* | |
StgRec [ | |
( Main.listAppend,StgRhsClosure CostCentreStack StgBinderInfo [] ReEntrant SRT [ds,l2] | |
( StgCase | |
( StgApp ds [] | |
) | |
UniqSet UniqSet wild SRT Alg Main.List [ | |
( DataAlt Main.Cons,[a,l1],[True,True],StgLet | |
( StgNonRec sat_s1Dy | |
( StgRhsClosure CostCentreStack StgBinderInfo [l1,l2] Updatable SRT [] |
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 ScopedTypeVariables #-} | |
module Main where | |
import Control.Applicative | |
import Control.Concurrent | |
import Control.Monad | |
import Data.Time.Clock | |
import Diagrams.Prelude | |
import Diagrams.Backend.Cairo | |
import System.Posix.Process |
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 QuasiQuotes #-} | |
module B where | |
import Text.Hamlet | |
import Text.Blaze | |
f :: Markup | |
f = [shamlet| <h1>Hello | |
<p>world |
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 ForeignFunctionInterface, QuasiQuotes #-} | |
module Main where | |
import Text.Blaze | |
import Text.Blaze.Renderer.String | |
import Text.Hamlet -- provided by hamlet package | |
foreign import ccall safe "sin" c_testImport :: Double -> IO Double |
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 ForeignFunctionInterface, QuasiQuotes #-} | |
module Main where | |
import Text.Blaze | |
import Text.Blaze.Renderer.String | |
import Text.Hamlet -- provided by hamlet package | |
foreign import ccall safe "sin" c_testImport :: Double -> IO Double |
OlderNewer