Search is not available for this dataset
repo_name
string
path
string
license
string
full_code
string
full_size
int64
uncommented_code
string
uncommented_size
int64
function_only_code
string
function_only_size
int64
is_commented
bool
is_signatured
bool
n_ast_errors
int64
ast_max_depth
int64
n_whitespaces
int64
n_ast_nodes
int64
n_ast_terminals
int64
n_ast_nonterminals
int64
loc
int64
cycloplexity
int64
DimaSamoz/mezzo
examples/src/Other/ClappingMusic.hs
mit
-- Make claps from pattern claps = flatten . map (\n -> if n then sco $ c en else sco $ r er)
93
claps = flatten . map (\n -> if n then sco $ c en else sco $ r er)
66
claps = flatten . map (\n -> if n then sco $ c en else sco $ r er)
66
true
false
2
10
23
49
23
26
null
null
lukaramu/yarn
src/Game/Yarn/ParseYarn.hs
mit
lUnset = string "unset" *> spaces *> (lIdentifier <?> "valid $identifier after 'unset'")
96
lUnset = string "unset" *> spaces *> (lIdentifier <?> "valid $identifier after 'unset'")
96
lUnset = string "unset" *> spaces *> (lIdentifier <?> "valid $identifier after 'unset'")
96
false
false
5
7
20
32
14
18
null
null
kawamuray/ganeti
src/Ganeti/Constants.hs
gpl-2.0
-- | Default delay target measured in sectors defaultDelayTarget :: Int defaultDelayTarget = 1
94
defaultDelayTarget :: Int defaultDelayTarget = 1
48
defaultDelayTarget = 1
22
true
true
0
4
13
12
7
5
null
null
fehu/HNat
src/Nat/Vec.hs
mit
v2Nil = NatsNil
15
v2Nil = NatsNil
15
v2Nil = NatsNil
15
false
false
1
5
2
10
3
7
null
null
bitemyapp/ghc
compiler/main/DynFlags.hs
bsd-3-clause
setGenDeriving :: TurnOnFlag -> DynP () setGenDeriving True = getCurLoc >>= \l -> upd (\d -> d { newDerivOnLoc = l })
118
setGenDeriving :: TurnOnFlag -> DynP () setGenDeriving True = getCurLoc >>= \l -> upd (\d -> d { newDerivOnLoc = l })
118
setGenDeriving True = getCurLoc >>= \l -> upd (\d -> d { newDerivOnLoc = l })
78
false
true
0
11
22
55
28
27
null
null
cchens/courseography
hs/PrivacyResponse.hs
gpl-3.0
privacyResponse :: Text -> ServerPart Response privacyResponse privacyContents = ok $ toResponse $ masterTemplate "Courseography - Privacy Policy" [H.meta ! A.name "keywords" ! A.content "", privacyLinks ] (do header "privacy" privacyHtml privacyContents ) ""
427
privacyResponse :: Text -> ServerPart Response privacyResponse privacyContents = ok $ toResponse $ masterTemplate "Courseography - Privacy Policy" [H.meta ! A.name "keywords" ! A.content "", privacyLinks ] (do header "privacy" privacyHtml privacyContents ) ""
427
privacyResponse privacyContents = ok $ toResponse $ masterTemplate "Courseography - Privacy Policy" [H.meta ! A.name "keywords" ! A.content "", privacyLinks ] (do header "privacy" privacyHtml privacyContents ) ""
380
false
true
4
9
201
89
38
51
null
null
diagrams/diagrams-contrib
src/Diagrams/Color/XKCD.hs
bsd-3-clause
greyishBrown = fromJust $ readHexColor "#7a6a4f"
57
greyishBrown = fromJust $ readHexColor "#7a6a4f"
57
greyishBrown = fromJust $ readHexColor "#7a6a4f"
57
false
false
0
6
14
13
6
7
null
null
giogadi/hs-collision-2d
app-src/test/Main.hs
mit
rectsCollision2Test :: Assertion rectsCollision2Test = let rect1 = [V2 0 0, V2 1 0, V2 1 1, V2 0 1] :: Polygon rect2 = [V2 1 0, V2 0 1, V2 (-1) 0, V2 0 (-1)] :: Polygon rect2Moved = map (+ V2 1.5 0.5) rect2 in inCollision rect1 rect2Moved @?= True
263
rectsCollision2Test :: Assertion rectsCollision2Test = let rect1 = [V2 0 0, V2 1 0, V2 1 1, V2 0 1] :: Polygon rect2 = [V2 1 0, V2 0 1, V2 (-1) 0, V2 0 (-1)] :: Polygon rect2Moved = map (+ V2 1.5 0.5) rect2 in inCollision rect1 rect2Moved @?= True
263
rectsCollision2Test = let rect1 = [V2 0 0, V2 1 0, V2 1 1, V2 0 1] :: Polygon rect2 = [V2 1 0, V2 0 1, V2 (-1) 0, V2 0 (-1)] :: Polygon rect2Moved = map (+ V2 1.5 0.5) rect2 in inCollision rect1 rect2Moved @?= True
230
false
true
0
12
67
135
70
65
null
null
fmapfmapfmap/amazonka
amazonka-codedeploy/gen/Network/AWS/CodeDeploy/Types.hs
mpl-2.0
-- | At least one deployment ID must be specified. _DeploymentIdRequiredException :: AsError a => Getting (First ServiceError) a ServiceError _DeploymentIdRequiredException = _ServiceError . hasCode "DeploymentIdRequiredException"
234
_DeploymentIdRequiredException :: AsError a => Getting (First ServiceError) a ServiceError _DeploymentIdRequiredException = _ServiceError . hasCode "DeploymentIdRequiredException"
183
_DeploymentIdRequiredException = _ServiceError . hasCode "DeploymentIdRequiredException"
92
true
true
0
8
29
39
19
20
null
null
bergey/plots
examples/simplepie.hs
bsd-3-clause
myaxis :: Axis B Polar Double myaxis = polarAxis &~ do wedgePlotFrom' 8 (rotate (0/25.9 @@ turn) xDir) (2.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (2.3/25.9 @@ turn) xDir) (5.6/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (7.9/25.9 @@ turn) xDir) (7.4/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (15.3/25.9 @@ turn) xDir) (4.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (19.6/25.9 @@ turn) xDir) (6.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8
700
myaxis :: Axis B Polar Double myaxis = polarAxis &~ do wedgePlotFrom' 8 (rotate (0/25.9 @@ turn) xDir) (2.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (2.3/25.9 @@ turn) xDir) (5.6/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (7.9/25.9 @@ turn) xDir) (7.4/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (15.3/25.9 @@ turn) xDir) (4.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (19.6/25.9 @@ turn) xDir) (6.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8
700
myaxis = polarAxis &~ do wedgePlotFrom' 8 (rotate (0/25.9 @@ turn) xDir) (2.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (2.3/25.9 @@ turn) xDir) (5.6/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (7.9/25.9 @@ turn) xDir) (7.4/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (15.3/25.9 @@ turn) xDir) (4.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8 wedgePlotFrom' 8 (rotate (19.6/25.9 @@ turn) xDir) (6.3/25.9 @@ turn) $ do strokeArc .= True fillOpacity .= 0.8
670
false
true
0
17
191
313
151
162
null
null
ion1/rrdgraph-haskell
Data/RRDGraph/Tests/Internal.hs
isc
prop_shrinkLens :: Foo -> Bool prop_shrinkLens f@(Foo foo bar) = shrinkLens shrink fooBarM f == [ Foo foo bar' | bar' <- shrink bar ]
135
prop_shrinkLens :: Foo -> Bool prop_shrinkLens f@(Foo foo bar) = shrinkLens shrink fooBarM f == [ Foo foo bar' | bar' <- shrink bar ]
135
prop_shrinkLens f@(Foo foo bar) = shrinkLens shrink fooBarM f == [ Foo foo bar' | bar' <- shrink bar ]
104
false
true
6
6
26
61
31
30
null
null
olorin/amazonka
amazonka-iam/test/Test/AWS/Gen/IAM.hs
mpl-2.0
testListGroupsResponse :: ListGroupsResponse -> TestTree testListGroupsResponse = res "ListGroupsResponse" "fixture/ListGroupsResponse.proto" iAM (Proxy :: Proxy ListGroups)
189
testListGroupsResponse :: ListGroupsResponse -> TestTree testListGroupsResponse = res "ListGroupsResponse" "fixture/ListGroupsResponse.proto" iAM (Proxy :: Proxy ListGroups)
189
testListGroupsResponse = res "ListGroupsResponse" "fixture/ListGroupsResponse.proto" iAM (Proxy :: Proxy ListGroups)
132
false
true
0
6
30
36
17
19
null
null
benjaminy/Charcoal
Testing/MicroTests/JustCalling/non_rec.hs
mit
b = f38 a
9
b = f38 a
9
b = f38 a
9
false
false
1
5
3
13
4
9
null
null
TomMD/ghc
compiler/types/Type.hs
bsd-3-clause
-- | What is the role assigned to the next parameter of this type? Usually, -- this will be 'Nominal', but if the type is a 'TyConApp', we may be able to -- do better. The type does *not* have to be well-kinded when applied for this -- to work! nextRole :: Type -> Role nextRole ty | Just (tc, tys) <- splitTyConApp_maybe ty , let num_tys = length tys , num_tys < tyConArity tc = tyConRoles tc `getNth` num_tys | otherwise = Nominal
445
nextRole :: Type -> Role nextRole ty | Just (tc, tys) <- splitTyConApp_maybe ty , let num_tys = length tys , num_tys < tyConArity tc = tyConRoles tc `getNth` num_tys | otherwise = Nominal
200
nextRole ty | Just (tc, tys) <- splitTyConApp_maybe ty , let num_tys = length tys , num_tys < tyConArity tc = tyConRoles tc `getNth` num_tys | otherwise = Nominal
175
true
true
0
11
96
96
45
51
null
null
acowley/ghc
libraries/template-haskell/Language/Haskell/TH/Ppr.hs
bsd-3-clause
pprLit _ (StringL s) = pprString s
38
pprLit _ (StringL s) = pprString s
38
pprLit _ (StringL s) = pprString s
38
false
false
0
7
10
20
9
11
null
null
fffej/HS-Poker
LookupPatternMatch.hs
bsd-3-clause
getValueFromProduct 750 = 2335
30
getValueFromProduct 750 = 2335
30
getValueFromProduct 750 = 2335
30
false
false
0
5
3
9
4
5
null
null
HJvT/hdirect
src/Parser.hs
bsd-3-clause
action_153 (156#) = happyShift action_128
41
action_153 (156#) = happyShift action_128
41
action_153 (156#) = happyShift action_128
41
false
false
0
6
4
15
7
8
null
null
phischu/fragnix
tests/packages/scotty/Network.Wai.Handler.Warp.Settings.hs
bsd-3-clause
-- | Apply the logic provided by 'defaultOnException' to determine if an -- exception should be shown or not. The goal is to hide exceptions which occur -- under the normal course of the web server running. -- -- Since 2.1.3 defaultShouldDisplayException :: SomeException -> Bool defaultShouldDisplayException se | Just ThreadKilled <- fromException se = False | Just (_ :: InvalidRequest) <- fromException se = False | Just (ioeGetErrorType -> et) <- fromException se , et == ResourceVanished || et == InvalidArgument = False | Just TimeoutThread <- fromException se = False | otherwise = True
622
defaultShouldDisplayException :: SomeException -> Bool defaultShouldDisplayException se | Just ThreadKilled <- fromException se = False | Just (_ :: InvalidRequest) <- fromException se = False | Just (ioeGetErrorType -> et) <- fromException se , et == ResourceVanished || et == InvalidArgument = False | Just TimeoutThread <- fromException se = False | otherwise = True
397
defaultShouldDisplayException se | Just ThreadKilled <- fromException se = False | Just (_ :: InvalidRequest) <- fromException se = False | Just (ioeGetErrorType -> et) <- fromException se , et == ResourceVanished || et == InvalidArgument = False | Just TimeoutThread <- fromException se = False | otherwise = True
342
true
true
1
11
123
140
67
73
null
null
vTurbine/ghc
compiler/typecheck/TcType.hs
bsd-3-clause
isFunPtrTy :: Type -> Bool isFunPtrTy ty | Just (tc, [_]) <- splitTyConApp_maybe ty = tc `hasKey` funPtrTyConKey | otherwise = False
140
isFunPtrTy :: Type -> Bool isFunPtrTy ty | Just (tc, [_]) <- splitTyConApp_maybe ty = tc `hasKey` funPtrTyConKey | otherwise = False
140
isFunPtrTy ty | Just (tc, [_]) <- splitTyConApp_maybe ty = tc `hasKey` funPtrTyConKey | otherwise = False
113
false
true
0
11
29
68
31
37
null
null
igniting/dictionary
Download.hs
gpl-3.0
calculateHash :: FilePath -> IO B.ByteString calculateHash = fmap hashlazy . L.readFile
87
calculateHash :: FilePath -> IO B.ByteString calculateHash = fmap hashlazy . L.readFile
87
calculateHash = fmap hashlazy . L.readFile
42
false
true
0
8
11
35
15
20
null
null
nrolland/react-flux
src/React/Flux/DOM.hs
bsd-3-clause
a_ :: Term eventHandler arg result => arg -> result; a_ = term "a"
66
a_ :: Term eventHandler arg result => arg -> result a_ = term "a"
65
a_ = term "a"
13
false
true
0
6
13
33
16
17
null
null
yousufmsoliman/music
Source (Haskell)/Interval.hs
gpl-3.0
perf5 = i 5 7
14
perf5 = i 5 7
14
perf5 = i 5 7
14
false
false
0
5
5
11
5
6
null
null
da-x/Algorithm-W-Step-By-Step
Lamdu/Infer/Internal/Scope.hs
gpl-3.0
-- TODO: Rename to typeMap scopeToTypeMap :: Scope -> Map V.Var Type scopeToTypeMap = scopeTypeOfVar
100
scopeToTypeMap :: Scope -> Map V.Var Type scopeToTypeMap = scopeTypeOfVar
73
scopeToTypeMap = scopeTypeOfVar
31
true
true
0
7
14
23
12
11
null
null
satai/FrozenBeagle
Simulation/Lib/src/SimulationConstants.hs
bsd-3-clause
accidentDeathProbability :: Double accidentDeathProbability = 0.0
65
accidentDeathProbability :: Double accidentDeathProbability = 0.0
65
accidentDeathProbability = 0.0
30
false
true
0
6
5
18
7
11
null
null
FranklinChen/hugs98-plus-Sep2006
packages/base/Data/Maybe.hs
bsd-3-clause
-- | The 'mapMaybe' function is a version of 'map' which can throw -- out elements. In particular, the functional argument returns -- something of type @'Maybe' b@. If this is 'Nothing', no element -- is added on to the result list. If it just @'Just' b@, then @b@ is -- included in the result list. mapMaybe :: (a -> Maybe b) -> [a] -> [b] mapMaybe _ [] = []
375
mapMaybe :: (a -> Maybe b) -> [a] -> [b] mapMaybe _ [] = []
72
mapMaybe _ [] = []
22
true
true
0
9
86
55
29
26
null
null
frantisekfarka/ghc-dsi
compiler/cmm/CmmCommonBlockElim.hs
bsd-3-clause
eqMaybeWith :: (a -> b -> Bool) -> Maybe a -> Maybe b -> Bool eqMaybeWith eltEq (Just e) (Just e') = eltEq e e'
111
eqMaybeWith :: (a -> b -> Bool) -> Maybe a -> Maybe b -> Bool eqMaybeWith eltEq (Just e) (Just e') = eltEq e e'
111
eqMaybeWith eltEq (Just e) (Just e') = eltEq e e'
49
false
true
0
11
24
69
32
37
null
null
jerhoud/true-real
src/Data/Digits.hs
gpl-3.0
add :: D -> D -> D add = zipWithCarry 1 (+)
43
add :: D -> D -> D add = zipWithCarry 1 (+)
43
add = zipWithCarry 1 (+)
24
false
true
0
8
11
32
15
17
null
null
Megaleo/Electras
src/Tile.hs
bsd-3-clause
zipTile _ [] = []
32
zipTile _ [] = []
32
zipTile _ [] = []
32
false
false
1
6
19
18
7
11
null
null
mettekou/ghc
compiler/typecheck/TcSigs.hs
bsd-3-clause
tcImpSpec :: (Name, Sig Name) -> TcM [TcSpecPrag] tcImpSpec (name, prag) = do { id <- tcLookupId name ; unless (isAnyInlinePragma (idInlinePragma id)) (addWarnTc NoReason (impSpecErr name)) ; tcSpecPrag id prag }
240
tcImpSpec :: (Name, Sig Name) -> TcM [TcSpecPrag] tcImpSpec (name, prag) = do { id <- tcLookupId name ; unless (isAnyInlinePragma (idInlinePragma id)) (addWarnTc NoReason (impSpecErr name)) ; tcSpecPrag id prag }
240
tcImpSpec (name, prag) = do { id <- tcLookupId name ; unless (isAnyInlinePragma (idInlinePragma id)) (addWarnTc NoReason (impSpecErr name)) ; tcSpecPrag id prag }
190
false
true
2
12
59
98
48
50
null
null
josefs/autosar
oldARSim/ARXML.hs
bsd-3-clause
toDest "DATA-TYPE-MAPPING-SET" = RSEDataTypeMappingSet
54
toDest "DATA-TYPE-MAPPING-SET" = RSEDataTypeMappingSet
54
toDest "DATA-TYPE-MAPPING-SET" = RSEDataTypeMappingSet
54
false
false
0
5
3
9
4
5
null
null
np/propellor
src/Utility/Env.hs
bsd-2-clause
{- Adds the environment variable to the input environment. If already - present in the list, removes the old value. - - This does not really belong here, but Data.AssocList is for some reason - buried inside hxt. -} addEntry :: Eq k => k -> v -> [(k, v)] -> [(k, v)] addEntry k v l = ( (k,v) : ) $! delEntry k l
316
addEntry :: Eq k => k -> v -> [(k, v)] -> [(k, v)] addEntry k v l = ( (k,v) : ) $! delEntry k l
95
addEntry k v l = ( (k,v) : ) $! delEntry k l
44
true
true
0
10
70
75
42
33
null
null
ocharles/hackage-server
Distribution/Client/Mirror/Session.hs
bsd-3-clause
downloadFile' :: URI -> FilePath -> HttpSession (Maybe GetError) downloadFile' uri file = do out $ "downloading " ++ show uri ++ " to " ++ file rsp <- requestGET uri case rsp of Left theError -> return (Just (GetError theError)) Right content -> do liftIO $ BS.writeFile file content --TODO: check we wrote the expected length. return Nothing
408
downloadFile' :: URI -> FilePath -> HttpSession (Maybe GetError) downloadFile' uri file = do out $ "downloading " ++ show uri ++ " to " ++ file rsp <- requestGET uri case rsp of Left theError -> return (Just (GetError theError)) Right content -> do liftIO $ BS.writeFile file content --TODO: check we wrote the expected length. return Nothing
408
downloadFile' uri file = do out $ "downloading " ++ show uri ++ " to " ++ file rsp <- requestGET uri case rsp of Left theError -> return (Just (GetError theError)) Right content -> do liftIO $ BS.writeFile file content --TODO: check we wrote the expected length. return Nothing
343
false
true
0
16
124
132
58
74
null
null
katydid/haslapse
src/Data/Katydid/Relapse/Exprs/Var.hs
bsd-3-clause
varBoolExpr :: Expr Bool varBoolExpr = Expr { desc = Desc { _name = "$bool" , _toStr = "$bool" , _hash = hashWithName "$bool" [] , _params = [] , _hasVar = True } , eval = \l -> case l of (Parser.Bool b) -> Right b _ -> Left "not a bool" }
296
varBoolExpr :: Expr Bool varBoolExpr = Expr { desc = Desc { _name = "$bool" , _toStr = "$bool" , _hash = hashWithName "$bool" [] , _params = [] , _hasVar = True } , eval = \l -> case l of (Parser.Bool b) -> Right b _ -> Left "not a bool" }
296
varBoolExpr = Expr { desc = Desc { _name = "$bool" , _toStr = "$bool" , _hash = hashWithName "$bool" [] , _params = [] , _hasVar = True } , eval = \l -> case l of (Parser.Bool b) -> Right b _ -> Left "not a bool" }
271
false
true
0
14
110
113
60
53
null
null
brendanhay/gogol
gogol-games-configuration/gen/Network/Google/Resource/GamesConfiguration/AchievementConfigurations/Get.hs
mpl-2.0
-- | Legacy upload protocol for media (e.g. \"media\", \"multipart\"). acgUploadType :: Lens' AchievementConfigurationsGet (Maybe Text) acgUploadType = lens _acgUploadType (\ s a -> s{_acgUploadType = a})
212
acgUploadType :: Lens' AchievementConfigurationsGet (Maybe Text) acgUploadType = lens _acgUploadType (\ s a -> s{_acgUploadType = a})
141
acgUploadType = lens _acgUploadType (\ s a -> s{_acgUploadType = a})
76
true
true
0
9
34
48
25
23
null
null
ahmadsalim/p3-tool
p3-tool/FPromela/Lexer.hs
gpl-3.0
commaSep1 :: Parser st a -> Parser st [a] commaSep1 = Tok.commaSep1 lexer
73
commaSep1 :: Parser st a -> Parser st [a] commaSep1 = Tok.commaSep1 lexer
73
commaSep1 = Tok.commaSep1 lexer
31
false
true
0
8
12
39
17
22
null
null
TomMD/ghc
compiler/codeGen/StgCmmPrim.hs
bsd-3-clause
doNewArrayOp :: CmmFormal -- ^ return register -> SMRep -- ^ representation of the array -> CLabel -- ^ info pointer -> [(CmmExpr, ByteOff)] -- ^ header payload -> WordOff -- ^ array size -> CmmExpr -- ^ initial element -> FCode () doNewArrayOp res_r rep info payload n init = do dflags <- getDynFlags let info_ptr = mkLblExpr info tickyAllocPrim (mkIntExpr dflags (hdrSize dflags rep)) (mkIntExpr dflags (nonHdrSize dflags rep)) (zeroExpr dflags) base <- allocHeapClosure rep info_ptr curCCS payload arr <- CmmLocal `fmap` newTemp (bWord dflags) emit $ mkAssign arr base -- Initialise all elements of the the array p <- assignTemp $ cmmOffsetB dflags (CmmReg arr) (hdrSize dflags rep) for <- newLabelC emitLabel for let loopBody = [ mkStore (CmmReg (CmmLocal p)) init , mkAssign (CmmLocal p) (cmmOffsetW dflags (CmmReg (CmmLocal p)) 1) , mkBranch for ] emit =<< mkCmmIfThen (cmmULtWord dflags (CmmReg (CmmLocal p)) (cmmOffsetW dflags (CmmReg arr) (hdrSizeW dflags rep + n))) (catAGraphs loopBody) emit $ mkAssign (CmmLocal res_r) (CmmReg arr) -- ---------------------------------------------------------------------------- -- Copying pointer arrays -- EZY: This code has an unusually high amount of assignTemp calls, seen -- nowhere else in the code generator. This is mostly because these -- "primitive" ops result in a surprisingly large amount of code. It -- will likely be worthwhile to optimize what is emitted here, so that -- our optimization passes don't waste time repeatedly optimizing the -- same bits of code. -- More closely imitates 'assignTemp' from the old code generator, which -- returns a CmmExpr rather than a LocalReg.
1,940
doNewArrayOp :: CmmFormal -- ^ return register -> SMRep -- ^ representation of the array -> CLabel -- ^ info pointer -> [(CmmExpr, ByteOff)] -- ^ header payload -> WordOff -- ^ array size -> CmmExpr -- ^ initial element -> FCode () doNewArrayOp res_r rep info payload n init = do dflags <- getDynFlags let info_ptr = mkLblExpr info tickyAllocPrim (mkIntExpr dflags (hdrSize dflags rep)) (mkIntExpr dflags (nonHdrSize dflags rep)) (zeroExpr dflags) base <- allocHeapClosure rep info_ptr curCCS payload arr <- CmmLocal `fmap` newTemp (bWord dflags) emit $ mkAssign arr base -- Initialise all elements of the the array p <- assignTemp $ cmmOffsetB dflags (CmmReg arr) (hdrSize dflags rep) for <- newLabelC emitLabel for let loopBody = [ mkStore (CmmReg (CmmLocal p)) init , mkAssign (CmmLocal p) (cmmOffsetW dflags (CmmReg (CmmLocal p)) 1) , mkBranch for ] emit =<< mkCmmIfThen (cmmULtWord dflags (CmmReg (CmmLocal p)) (cmmOffsetW dflags (CmmReg arr) (hdrSizeW dflags rep + n))) (catAGraphs loopBody) emit $ mkAssign (CmmLocal res_r) (CmmReg arr) -- ---------------------------------------------------------------------------- -- Copying pointer arrays -- EZY: This code has an unusually high amount of assignTemp calls, seen -- nowhere else in the code generator. This is mostly because these -- "primitive" ops result in a surprisingly large amount of code. It -- will likely be worthwhile to optimize what is emitted here, so that -- our optimization passes don't waste time repeatedly optimizing the -- same bits of code. -- More closely imitates 'assignTemp' from the old code generator, which -- returns a CmmExpr rather than a LocalReg.
1,940
doNewArrayOp res_r rep info payload n init = do dflags <- getDynFlags let info_ptr = mkLblExpr info tickyAllocPrim (mkIntExpr dflags (hdrSize dflags rep)) (mkIntExpr dflags (nonHdrSize dflags rep)) (zeroExpr dflags) base <- allocHeapClosure rep info_ptr curCCS payload arr <- CmmLocal `fmap` newTemp (bWord dflags) emit $ mkAssign arr base -- Initialise all elements of the the array p <- assignTemp $ cmmOffsetB dflags (CmmReg arr) (hdrSize dflags rep) for <- newLabelC emitLabel for let loopBody = [ mkStore (CmmReg (CmmLocal p)) init , mkAssign (CmmLocal p) (cmmOffsetW dflags (CmmReg (CmmLocal p)) 1) , mkBranch for ] emit =<< mkCmmIfThen (cmmULtWord dflags (CmmReg (CmmLocal p)) (cmmOffsetW dflags (CmmReg arr) (hdrSizeW dflags rep + n))) (catAGraphs loopBody) emit $ mkAssign (CmmLocal res_r) (CmmReg arr) -- ---------------------------------------------------------------------------- -- Copying pointer arrays -- EZY: This code has an unusually high amount of assignTemp calls, seen -- nowhere else in the code generator. This is mostly because these -- "primitive" ops result in a surprisingly large amount of code. It -- will likely be worthwhile to optimize what is emitted here, so that -- our optimization passes don't waste time repeatedly optimizing the -- same bits of code. -- More closely imitates 'assignTemp' from the old code generator, which -- returns a CmmExpr rather than a LocalReg.
1,558
false
true
0
18
554
409
203
206
null
null
dzamkov/Oedel
src/Control/Reactive/IO.hs
mit
-- TODO -- | Dynamically switches between behaviors. switchB :: Behavior (Behavior a) -> Behavior a switchB = error "not implemented"
138
switchB :: Behavior (Behavior a) -> Behavior a switchB = error "not implemented"
80
switchB = error "not implemented"
33
true
true
0
8
25
32
16
16
null
null
DougBurke/swish
tests/RDFProofContextTest.hs
lgpl-2.1
rdfAxiom10 :: Test rdfAxiom10 = testEq "rdfAxiom10" "xsd_string:dt" $ show (formName rdfAxiomStrDt)
115
rdfAxiom10 :: Test rdfAxiom10 = testEq "rdfAxiom10" "xsd_string:dt" $ show (formName rdfAxiomStrDt)
115
rdfAxiom10 = testEq "rdfAxiom10" "xsd_string:dt" $ show (formName rdfAxiomStrDt)
96
false
true
0
8
27
29
14
15
null
null
Snoxicle/Chesska
chess.hs
gpl-2.0
orwardDir :: Color -> Y forwardDir White = 1
45
forwardDir :: Color -> Y forwardDir White = 1
45
forwardDir White = 1
20
false
true
0
5
9
18
9
9
null
null
termite2/tsl
Abstract/Predicate.hs
bsd-3-clause
avarWidth (AVarInt t) = termWidth t
36
avarWidth (AVarInt t) = termWidth t
36
avarWidth (AVarInt t) = termWidth t
36
false
false
0
6
6
19
8
11
null
null
sboosali/commands-core
sources/Commands/Extra.hs
mit
{- | the maximal cycles of a directed graph (represented as an adjacency list) wraps 'stronglyConnComp' >>> :{ let graph = [ ("non recursive", "N", []) , ("self recursive", "S", ["S"]) , ("mutually recursive A", "A", ["B"]) , ("mutually recursive B", "B", ["A","C"]) , ("mutually recursive C", "C", ["A","S","N"]) ] :} >>> cycles graph [["self recursive"],["mutually recursive A","mutually recursive B","mutually recursive C"]] properties: * the output @[[n]]@ is disjoint i.e. the cycles are maximal * each output element @n@ comes from the input @Graph n e@ (but not the converse e.g. the output can be empty) * when input an acyclic graph, the empty list is output (a singleton means the node has an edge to itself i.e. self-recursion) (in particular, the empty graph, lists, trees, DAGs) * when input a complete graph, the singleton list of (the list of) vertices is output TODO verify: @ \as -> Set.fromList (map fst $ as) == Set.fromList (flattenSCCs . stronglyConnComp $ as) @ i.e. it preserves the exact input nodes. which means that the partial 'find' can be safely assumed total. -} cycles :: Ord k => [Adjacency k n] -> [[n]] cycles = sccs2cycles . stronglyConnComp
1,259
cycles :: Ord k => [Adjacency k n] -> [[n]] cycles = sccs2cycles . stronglyConnComp
83
cycles = sccs2cycles . stronglyConnComp
39
true
true
0
8
277
41
22
19
null
null
sdiehl/ghc
libraries/base/Data/OldList.hs
bsd-3-clause
transpose ((x:xs) : xss) = (x : [h | (h:_) <- xss]) : transpose (xs : [ t | (_:t) <- xss])
90
transpose ((x:xs) : xss) = (x : [h | (h:_) <- xss]) : transpose (xs : [ t | (_:t) <- xss])
90
transpose ((x:xs) : xss) = (x : [h | (h:_) <- xss]) : transpose (xs : [ t | (_:t) <- xss])
90
false
false
0
13
21
80
43
37
null
null
beni55/haste-compiler
libraries/ghc-7.8/base/GHC/Event/Manager.hs
bsd-3-clause
finished :: EventManager -> IO Bool finished mgr = (== Finished) `liftM` readIORef (emState mgr)
96
finished :: EventManager -> IO Bool finished mgr = (== Finished) `liftM` readIORef (emState mgr)
96
finished mgr = (== Finished) `liftM` readIORef (emState mgr)
60
false
true
0
8
14
44
22
22
null
null
rakete/ObjViewer
src/Math/Quaternion.hs
bsd-3-clause
rotateQuatGL :: GL.Vertex4 GL.GLfloat -> IO () rotateQuatGL q = do (m :: GL.GLmatrix GL.GLfloat) <- GL.newMatrix GL.RowMajor $ quatMat q GL.multMatrix m
160
rotateQuatGL :: GL.Vertex4 GL.GLfloat -> IO () rotateQuatGL q = do (m :: GL.GLmatrix GL.GLfloat) <- GL.newMatrix GL.RowMajor $ quatMat q GL.multMatrix m
160
rotateQuatGL q = do (m :: GL.GLmatrix GL.GLfloat) <- GL.newMatrix GL.RowMajor $ quatMat q GL.multMatrix m
113
false
true
0
11
30
73
33
40
null
null
mapinguari/SC_HS_Proxy
src/Proxy/Query/Unit.hs
mit
airRange TerranSCV = 0
22
airRange TerranSCV = 0
22
airRange TerranSCV = 0
22
false
false
0
5
3
9
4
5
null
null
NCrashed/hjass
src/library/Language/Jass/Codegen/Expression.hs
mit
genLLVMExpression expr@(UnaryExpression _ op val) = do (valNameRaw, valInstr) <- genLLVMExpression val resJassType <- inferType expr valJassType <- inferType val (valName, valConvInstr) <- genConvertion valJassType resJassType valNameRaw opName <- generateName $ showUnaryOpAsWord op resType <- toLLVMType resJassType let instr = opName := genUnaryOp op resType valName return (opName, valInstr ++ valConvInstr ++ [instr])
438
genLLVMExpression expr@(UnaryExpression _ op val) = do (valNameRaw, valInstr) <- genLLVMExpression val resJassType <- inferType expr valJassType <- inferType val (valName, valConvInstr) <- genConvertion valJassType resJassType valNameRaw opName <- generateName $ showUnaryOpAsWord op resType <- toLLVMType resJassType let instr = opName := genUnaryOp op resType valName return (opName, valInstr ++ valConvInstr ++ [instr])
438
genLLVMExpression expr@(UnaryExpression _ op val) = do (valNameRaw, valInstr) <- genLLVMExpression val resJassType <- inferType expr valJassType <- inferType val (valName, valConvInstr) <- genConvertion valJassType resJassType valNameRaw opName <- generateName $ showUnaryOpAsWord op resType <- toLLVMType resJassType let instr = opName := genUnaryOp op resType valName return (opName, valInstr ++ valConvInstr ++ [instr])
438
false
false
1
12
68
150
68
82
null
null
jonsterling/ETT-Lite
src/Environment.hs
bsd-3-clause
-- | Extend the context with a list of bindings extendCtxs :: (MonadReader Env m) => [Decl] -> m a -> m a extendCtxs ds = local (\ m@(Env {ctx = cs}) -> m { ctx = ds ++ cs })
176
extendCtxs :: (MonadReader Env m) => [Decl] -> m a -> m a extendCtxs ds = local (\ m@(Env {ctx = cs}) -> m { ctx = ds ++ cs })
128
extendCtxs ds = local (\ m@(Env {ctx = cs}) -> m { ctx = ds ++ cs })
70
true
true
0
12
42
86
45
41
null
null
frantisekfarka/ghc-dsi
compiler/main/DynFlags.hs
bsd-3-clause
wayOptc _ WayNDP = []
28
wayOptc _ WayNDP = []
28
wayOptc _ WayNDP = []
28
false
false
0
5
11
13
6
7
null
null
rueshyna/gogol
gogol-genomics/gen/Network/Google/Genomics/Types/Product.hs
mpl-2.0
-- | Creates a value of 'VariantSetMetadata' with the minimum fields required to make a request. -- -- Use one of the following lenses to modify other fields as desired: -- -- * 'vsmValue' -- -- * 'vsmKey' -- -- * 'vsmId' -- -- * 'vsmType' -- -- * 'vsmNumber' -- -- * 'vsmDescription' -- -- * 'vsmInfo' variantSetMetadata :: VariantSetMetadata variantSetMetadata = VariantSetMetadata' { _vsmValue = Nothing , _vsmKey = Nothing , _vsmId = Nothing , _vsmType = Nothing , _vsmNumber = Nothing , _vsmDescription = Nothing , _vsmInfo = Nothing }
580
variantSetMetadata :: VariantSetMetadata variantSetMetadata = VariantSetMetadata' { _vsmValue = Nothing , _vsmKey = Nothing , _vsmId = Nothing , _vsmType = Nothing , _vsmNumber = Nothing , _vsmDescription = Nothing , _vsmInfo = Nothing }
277
variantSetMetadata = VariantSetMetadata' { _vsmValue = Nothing , _vsmKey = Nothing , _vsmId = Nothing , _vsmType = Nothing , _vsmNumber = Nothing , _vsmDescription = Nothing , _vsmInfo = Nothing }
232
true
true
1
7
132
79
53
26
null
null
danplubell/yarpn
yarpnc/src/Main.hs
mit
validated::String -> Bool validated s = True
44
validated::String -> Bool validated s = True
44
validated s = True
18
false
true
0
5
6
18
9
9
null
null
chriseidhof/formlets
Text/Formlets.hs
bsd-3-clause
input' :: Monad m => (String -> String -> xml) -- ^ function which takes the control name, the initial value, and returns the control markup -> Maybe String -- ^ optional default value -> Form xml m String input' i defaultValue = generalInput' i' fromLeft -- `check` maybe (Failure ["not in the data"]) Success where i' n v = i n (fromMaybe (fromMaybe "" defaultValue) v) fromLeft n Nothing = FR.NotAvailable $ n ++ " is not in the data" fromLeft n (Just (Left x)) = FR.Success x fromLeft n (Just (Right _)) = FR.Failure [n ++ " is a file, but should not have been."]
631
input' :: Monad m => (String -> String -> xml) -- ^ function which takes the control name, the initial value, and returns the control markup -> Maybe String -- ^ optional default value -> Form xml m String input' i defaultValue = generalInput' i' fromLeft -- `check` maybe (Failure ["not in the data"]) Success where i' n v = i n (fromMaybe (fromMaybe "" defaultValue) v) fromLeft n Nothing = FR.NotAvailable $ n ++ " is not in the data" fromLeft n (Just (Left x)) = FR.Success x fromLeft n (Just (Right _)) = FR.Failure [n ++ " is a file, but should not have been."]
631
input' i defaultValue = generalInput' i' fromLeft -- `check` maybe (Failure ["not in the data"]) Success where i' n v = i n (fromMaybe (fromMaybe "" defaultValue) v) fromLeft n Nothing = FR.NotAvailable $ n ++ " is not in the data" fromLeft n (Just (Left x)) = FR.Success x fromLeft n (Just (Right _)) = FR.Failure [n ++ " is a file, but should not have been."]
403
false
true
3
11
170
173
86
87
null
null
DanielSchuessler/hstri
PolymakeInterface.hs
gpl-3.0
renderPmScalarType :: forall s. PmScalar s => s -> Doc renderPmScalarType _ = text (pmScalarTypeName (undefined :: s))
118
renderPmScalarType :: forall s. PmScalar s => s -> Doc renderPmScalarType _ = text (pmScalarTypeName (undefined :: s))
118
renderPmScalarType _ = text (pmScalarTypeName (undefined :: s))
63
false
true
0
8
17
50
24
26
null
null
tonicebrian/sgf
Data/SGF/Parse.hs
bsd-3-clause
addMarks marks (mark, points) = tell warning >> return result where (ignored, inserted) = partition (`Map.member` marks) points warning = map (DuplicateMarkupOmitted . (,) mark) ignored result = marks `Map.union` Map.fromList [(i, mark) | i <- inserted]
266
addMarks marks (mark, points) = tell warning >> return result where (ignored, inserted) = partition (`Map.member` marks) points warning = map (DuplicateMarkupOmitted . (,) mark) ignored result = marks `Map.union` Map.fromList [(i, mark) | i <- inserted]
266
addMarks marks (mark, points) = tell warning >> return result where (ignored, inserted) = partition (`Map.member` marks) points warning = map (DuplicateMarkupOmitted . (,) mark) ignored result = marks `Map.union` Map.fromList [(i, mark) | i <- inserted]
266
false
false
0
11
49
114
61
53
null
null
rahulmutt/ghcvm
compiler/Eta/Prelude/PrimOp.hs
bsd-3-clause
tagOf_PrimOp MaskStatus = _ILIT(332)
36
tagOf_PrimOp MaskStatus = _ILIT(332)
36
tagOf_PrimOp MaskStatus = _ILIT(332)
36
false
false
0
6
3
15
7
8
null
null
brendanhay/gogol
gogol-books/gen/Network/Google/Books/Types/Product.hs
mpl-2.0
-- | Creates a value of 'UserSettings' with the minimum fields required to make a request. -- -- Use one of the following lenses to modify other fields as desired: -- -- * 'usNotification' -- -- * 'usKind' -- -- * 'usNotesExport' userSettings :: UserSettings userSettings = UserSettings' {_usNotification = Nothing, _usKind = Nothing, _usNotesExport = Nothing}
370
userSettings :: UserSettings userSettings = UserSettings' {_usNotification = Nothing, _usKind = Nothing, _usNotesExport = Nothing}
140
userSettings = UserSettings' {_usNotification = Nothing, _usKind = Nothing, _usNotesExport = Nothing}
107
true
true
1
7
66
47
29
18
null
null
poxu/pandoc
src/Text/Pandoc/Writers/LaTeX.hs
gpl-2.0
toPolyglossia ("grc":_) = ("greek", "variant=ancient")
67
toPolyglossia ("grc":_) = ("greek", "variant=ancient")
67
toPolyglossia ("grc":_) = ("greek", "variant=ancient")
67
false
false
0
7
17
22
12
10
null
null
lukemaurer/sequent-core
src/Language/SequentCore/Arity.hs
bsd-3-clause
-- See Note [Combining case branches] andArityType (AArr os1 at1) (AArr os2 at2) = AArr (os1 `bestOneShot` os2) (andArityType at1 at2)
184
andArityType (AArr os1 at1) (AArr os2 at2) = AArr (os1 `bestOneShot` os2) (andArityType at1 at2)
146
andArityType (AArr os1 at1) (AArr os2 at2) = AArr (os1 `bestOneShot` os2) (andArityType at1 at2)
146
true
false
0
7
70
50
26
24
null
null
mydaum/cabal
cabal-install/Distribution/Solver/Types/PackageIndex.hs
bsd-3-clause
mergeBuckets xs@(x:xs') ys@(y:ys') = case packageId x `compare` packageId y of GT -> y : mergeBuckets xs ys' EQ -> y : mergeBuckets xs' ys' LT -> x : mergeBuckets xs' ys -- | Inserts a single package into the index. -- -- This is equivalent to (but slightly quicker than) using 'mappend' or -- 'merge' with a singleton index. --
360
mergeBuckets xs@(x:xs') ys@(y:ys') = case packageId x `compare` packageId y of GT -> y : mergeBuckets xs ys' EQ -> y : mergeBuckets xs' ys' LT -> x : mergeBuckets xs' ys -- | Inserts a single package into the index. -- -- This is equivalent to (but slightly quicker than) using 'mappend' or -- 'merge' with a singleton index. --
360
mergeBuckets xs@(x:xs') ys@(y:ys') = case packageId x `compare` packageId y of GT -> y : mergeBuckets xs ys' EQ -> y : mergeBuckets xs' ys' LT -> x : mergeBuckets xs' ys -- | Inserts a single package into the index. -- -- This is equivalent to (but slightly quicker than) using 'mappend' or -- 'merge' with a singleton index. --
360
false
false
0
9
92
97
51
46
null
null
peterokagey/haskellOEIS
test/Delahaye/A337946Spec.hs
apache-2.0
spec :: Spec spec = describe "A337946" $ it "correctly computes the first 20 elements" $ take 20 (map a337946 [1..]) `shouldBe` expectedValue where expectedValue = [1, 3, 7, 12, 22, 30, 47, 61, 85, 113, 126, 177, 193, 246, 279, 321, 341, 428, 499, 571]
264
spec :: Spec spec = describe "A337946" $ it "correctly computes the first 20 elements" $ take 20 (map a337946 [1..]) `shouldBe` expectedValue where expectedValue = [1, 3, 7, 12, 22, 30, 47, 61, 85, 113, 126, 177, 193, 246, 279, 321, 341, 428, 499, 571]
264
spec = describe "A337946" $ it "correctly computes the first 20 elements" $ take 20 (map a337946 [1..]) `shouldBe` expectedValue where expectedValue = [1, 3, 7, 12, 22, 30, 47, 61, 85, 113, 126, 177, 193, 246, 279, 321, 341, 428, 499, 571]
251
false
true
0
10
57
114
68
46
null
null
danr/hipspec
testsuite/prod/zeno_version/PropT11.hs
gpl-3.0
drop :: Nat -> [a] -> [a] drop Z xs = xs
48
drop :: Nat -> [a] -> [a] drop Z xs = xs
48
drop Z xs = xs
22
false
true
0
7
19
30
16
14
null
null
lfritz/python-type-inference
python-type-inference/src/Language/Python/TypeInference/CFG/ToFragment.hs
bsd-3-clause
paramName (AST.VarArgsPos (AST.Ident name _) _ _) = return [name]
69
paramName (AST.VarArgsPos (AST.Ident name _) _ _) = return [name]
69
paramName (AST.VarArgsPos (AST.Ident name _) _ _) = return [name]
69
false
false
0
10
13
37
18
19
null
null
jotrk/xhb-ewmh
src/Graphics/XHB/Ewmh.hs
bsd-2-clause
getNetNumberOfDesktops :: EwmhCtx m => Connection -> m (Either SomeError Word32) getNetNumberOfDesktops c = getRootProp c NET_NUMBER_OF_DESKTOPS AtomCARDINAL
157
getNetNumberOfDesktops :: EwmhCtx m => Connection -> m (Either SomeError Word32) getNetNumberOfDesktops c = getRootProp c NET_NUMBER_OF_DESKTOPS AtomCARDINAL
157
getNetNumberOfDesktops c = getRootProp c NET_NUMBER_OF_DESKTOPS AtomCARDINAL
76
false
true
0
9
17
43
20
23
null
null
sdiehl/ghc
compiler/nativeGen/Dwarf/Constants.hs
bsd-3-clause
dW_CFA_same_value = 0x08
32
dW_CFA_same_value = 0x08
32
dW_CFA_same_value = 0x08
32
false
false
0
4
10
6
3
3
null
null
seckcoder/vector
Data/Vector/Storable/Mutable.hs
bsd-3-clause
unsafeInit = G.unsafeInit
25
unsafeInit = G.unsafeInit
25
unsafeInit = G.unsafeInit
25
false
false
1
6
2
12
4
8
null
null
frontrowed/stratosphere
gen/src/Gen/Render/Types.hs
mit
createModules :: [PropertyType] -> [ResourceType] -> [Module] createModules properties resources = let propertyModules = moduleFromPropertyType <$> properties resourceModules = moduleFromResourceType <$> resources allPropertyNames = Set.fromList $ propertyTypeName <$> properties in fmap (normalizePropertyNames allPropertyNames) (resourceModules ++ propertyModules)
382
createModules :: [PropertyType] -> [ResourceType] -> [Module] createModules properties resources = let propertyModules = moduleFromPropertyType <$> properties resourceModules = moduleFromResourceType <$> resources allPropertyNames = Set.fromList $ propertyTypeName <$> properties in fmap (normalizePropertyNames allPropertyNames) (resourceModules ++ propertyModules)
382
createModules properties resources = let propertyModules = moduleFromPropertyType <$> properties resourceModules = moduleFromResourceType <$> resources allPropertyNames = Set.fromList $ propertyTypeName <$> properties in fmap (normalizePropertyNames allPropertyNames) (resourceModules ++ propertyModules)
320
false
true
0
11
51
90
47
43
null
null
linuborj/cubicaltt
Eval.hs
mit
lemEq :: Val -> Val -> System (Val,Val) -> (Val,Val) lemEq eq b aps = (a,VPLam i (compNeg j (eq @@ j) p1 thetas')) where i:j:_ = freshs (eq,b,aps) ta = eq @@ One p1s = mapWithKey (\alpha (aa,pa) -> let eqaj = (eq `face` alpha) @@ j ba = b `face` alpha in comp j eqaj (pa @@ i) (mkSystem [ (i~>0,transFill j eqaj ba) , (i~>1,transFillNeg j eqaj aa)])) aps thetas = mapWithKey (\alpha (aa,pa) -> let eqaj = (eq `face` alpha) @@ j ba = b `face` alpha in fill j eqaj (pa @@ i) (mkSystem [ (i~>0,transFill j eqaj ba) , (i~>1,transFillNeg j eqaj aa)])) aps a = comp i ta (trans i (eq @@ i) b) p1s p1 = fill i ta (trans i (eq @@ i) b) p1s thetas' = insertsSystem [ (i ~> 0,transFill j (eq @@ j) b) , (i ~> 1,transFillNeg j (eq @@ j) a)] thetas -- Old version: -- This version triggers the following error when checking the normal form of corrUniv: -- Parsed "examples/nunivalence2.ctt" successfully! -- Resolver failed: Cannot resolve name !3 at position (7,30062) in module nunivalence2 -- compU :: Name -> Val -> System Val -> Val -> System Val -> Val -- compU i b es wi0 ws = glueElem vi1'' usi1'' -- where bi1 = b `face` (i ~> 1) -- vs = mapWithKey (\alpha wAlpha -> -- unGlueU wAlpha (b `face` alpha) (es `face` alpha)) ws -- vsi1 = vs `face` (i ~> 1) -- same as: border vi1 vs -- vi0 = unGlueU wi0 (b `face` (i ~> 0)) (es `face` (i ~> 0)) -- in b(i0) -- v = fill i b vi0 vs -- in b -- vi1 = comp i b vi0 vs -- is v `face` (i ~> 1) in b(i1) -- esI1 = es `face` (i ~> 1) -- es' = filterWithKey (\alpha _ -> i `Map.notMember` alpha) es -- es'' = filterWithKey (\alpha _ -> alpha `Map.notMember` es) esI1 -- us' = mapWithKey (\gamma eGamma -> -- fill i (eGamma @@ One) (wi0 `face` gamma) (ws `face` gamma)) -- es' -- usi1' = mapWithKey (\gamma eGamma -> -- comp i (eGamma @@ One) (wi0 `face` gamma) (ws `face` gamma)) -- es' -- ls' = mapWithKey (\gamma eGamma -> -- pathComp i (b `face` gamma) (v `face` gamma) -- (transNegLine eGamma (us' ! gamma)) (vs `face` gamma)) -- es' -- vi1' = compLine (constPath bi1) vi1 -- (ls' `unionSystem` Map.map constPath vsi1) -- wsi1 = ws `face` (i ~> 1) -- -- for gamma in es'', (i1) gamma is in es, so wsi1 gamma -- -- is in the domain of isoGamma -- uls'' = mapWithKey (\gamma eGamma -> -- gradLemmaU (bi1 `face` gamma) eGamma -- ((usi1' `face` gamma) `unionSystem` (wsi1 `face` gamma)) -- (vi1' `face` gamma)) -- es'' -- vsi1' = Map.map constPath $ border vi1' es' `unionSystem` vsi1 -- vi1'' = compLine (constPath bi1) vi1' -- (Map.map snd uls'' `unionSystem` vsi1') -- usi1'' = Map.mapWithKey (\gamma _ -> -- if gamma `Map.member` usi1' then usi1' ! gamma -- else fst (uls'' ! gamma)) -- esI1 -- Grad Lemma, takes a line eq in U, a system us and a value v, s.t. f us = -- border v. Outputs (u,p) s.t. border u = us and a path p between v -- and f u, where f is transNegLine eq -- gradLemmaU :: Val -> Val -> System Val -> Val -> (Val, Val) -- gradLemmaU b eq us v = (u, VPLam i theta) -- where i:j:_ = freshs (b,eq,us,v) -- ej = eq @@ j -- a = eq @@ One -- ws = mapWithKey (\alpha uAlpha -> -- transFillNeg j (ej `face` alpha) uAlpha) us -- u = comp j ej v ws -- w = fill j ej v ws -- xs = insertSystem (i ~> 0) w $ -- insertSystem (i ~> 1) (transFillNeg j ej u) $ ws -- theta = compNeg j ej u xs -- Old version: -- gradLemmaU :: Val -> Val -> System Val -> Val -> (Val, Val) -- gradLemmaU b eq us v = (u, VPLam i theta'') -- where i:j:_ = freshs (b,eq,us,v) -- a = eq @@ One -- g = transLine -- f = transNegLine -- s e y = VPLam j $ compNeg i (e @@ i) (trans i (e @@ i) y) -- (mkSystem [(j ~> 0, transFill j (e @@ j) y) -- ,(j ~> 1, transFillNeg j (e @@ j) -- (trans j (e @@ j) y))]) -- t e x = VPLam j $ comp i (e @@ i) (transNeg i (e @@ i) x) -- (mkSystem [(j ~> 0, transFill j (e @@ j) -- (transNeg j (e @@ j) x)) -- ,(j ~> 1, transFillNeg j (e @@ j) x)]) -- gv = g eq v -- us' = mapWithKey (\alpha uAlpha -> -- t (eq `face` alpha) uAlpha @@ i) us -- theta = fill i a gv us' -- u = comp i a gv us' -- Same as "theta `face` (i ~> 1)" -- ws = insertSystem (i ~> 0) gv $ -- insertSystem (i ~> 1) (t eq u @@ j) $ -- mapWithKey -- (\alpha uAlpha -> -- t (eq `face` alpha) uAlpha @@ (Atom i :/\: Atom j)) us -- theta' = compNeg j a theta ws -- xs = insertSystem (i ~> 0) (s eq v @@ j) $ -- insertSystem (i ~> 1) (s eq (f eq u) @@ j) $ -- mapWithKey -- (\alpha uAlpha -> -- s (eq `face` alpha) (f (eq `face` alpha) uAlpha) @@ j) us -- theta'' = comp j b (f eq theta') xs ------------------------------------------------------------------------------- -- | Conversion
5,949
lemEq :: Val -> Val -> System (Val,Val) -> (Val,Val) lemEq eq b aps = (a,VPLam i (compNeg j (eq @@ j) p1 thetas')) where i:j:_ = freshs (eq,b,aps) ta = eq @@ One p1s = mapWithKey (\alpha (aa,pa) -> let eqaj = (eq `face` alpha) @@ j ba = b `face` alpha in comp j eqaj (pa @@ i) (mkSystem [ (i~>0,transFill j eqaj ba) , (i~>1,transFillNeg j eqaj aa)])) aps thetas = mapWithKey (\alpha (aa,pa) -> let eqaj = (eq `face` alpha) @@ j ba = b `face` alpha in fill j eqaj (pa @@ i) (mkSystem [ (i~>0,transFill j eqaj ba) , (i~>1,transFillNeg j eqaj aa)])) aps a = comp i ta (trans i (eq @@ i) b) p1s p1 = fill i ta (trans i (eq @@ i) b) p1s thetas' = insertsSystem [ (i ~> 0,transFill j (eq @@ j) b) , (i ~> 1,transFillNeg j (eq @@ j) a)] thetas -- Old version: -- This version triggers the following error when checking the normal form of corrUniv: -- Parsed "examples/nunivalence2.ctt" successfully! -- Resolver failed: Cannot resolve name !3 at position (7,30062) in module nunivalence2 -- compU :: Name -> Val -> System Val -> Val -> System Val -> Val -- compU i b es wi0 ws = glueElem vi1'' usi1'' -- where bi1 = b `face` (i ~> 1) -- vs = mapWithKey (\alpha wAlpha -> -- unGlueU wAlpha (b `face` alpha) (es `face` alpha)) ws -- vsi1 = vs `face` (i ~> 1) -- same as: border vi1 vs -- vi0 = unGlueU wi0 (b `face` (i ~> 0)) (es `face` (i ~> 0)) -- in b(i0) -- v = fill i b vi0 vs -- in b -- vi1 = comp i b vi0 vs -- is v `face` (i ~> 1) in b(i1) -- esI1 = es `face` (i ~> 1) -- es' = filterWithKey (\alpha _ -> i `Map.notMember` alpha) es -- es'' = filterWithKey (\alpha _ -> alpha `Map.notMember` es) esI1 -- us' = mapWithKey (\gamma eGamma -> -- fill i (eGamma @@ One) (wi0 `face` gamma) (ws `face` gamma)) -- es' -- usi1' = mapWithKey (\gamma eGamma -> -- comp i (eGamma @@ One) (wi0 `face` gamma) (ws `face` gamma)) -- es' -- ls' = mapWithKey (\gamma eGamma -> -- pathComp i (b `face` gamma) (v `face` gamma) -- (transNegLine eGamma (us' ! gamma)) (vs `face` gamma)) -- es' -- vi1' = compLine (constPath bi1) vi1 -- (ls' `unionSystem` Map.map constPath vsi1) -- wsi1 = ws `face` (i ~> 1) -- -- for gamma in es'', (i1) gamma is in es, so wsi1 gamma -- -- is in the domain of isoGamma -- uls'' = mapWithKey (\gamma eGamma -> -- gradLemmaU (bi1 `face` gamma) eGamma -- ((usi1' `face` gamma) `unionSystem` (wsi1 `face` gamma)) -- (vi1' `face` gamma)) -- es'' -- vsi1' = Map.map constPath $ border vi1' es' `unionSystem` vsi1 -- vi1'' = compLine (constPath bi1) vi1' -- (Map.map snd uls'' `unionSystem` vsi1') -- usi1'' = Map.mapWithKey (\gamma _ -> -- if gamma `Map.member` usi1' then usi1' ! gamma -- else fst (uls'' ! gamma)) -- esI1 -- Grad Lemma, takes a line eq in U, a system us and a value v, s.t. f us = -- border v. Outputs (u,p) s.t. border u = us and a path p between v -- and f u, where f is transNegLine eq -- gradLemmaU :: Val -> Val -> System Val -> Val -> (Val, Val) -- gradLemmaU b eq us v = (u, VPLam i theta) -- where i:j:_ = freshs (b,eq,us,v) -- ej = eq @@ j -- a = eq @@ One -- ws = mapWithKey (\alpha uAlpha -> -- transFillNeg j (ej `face` alpha) uAlpha) us -- u = comp j ej v ws -- w = fill j ej v ws -- xs = insertSystem (i ~> 0) w $ -- insertSystem (i ~> 1) (transFillNeg j ej u) $ ws -- theta = compNeg j ej u xs -- Old version: -- gradLemmaU :: Val -> Val -> System Val -> Val -> (Val, Val) -- gradLemmaU b eq us v = (u, VPLam i theta'') -- where i:j:_ = freshs (b,eq,us,v) -- a = eq @@ One -- g = transLine -- f = transNegLine -- s e y = VPLam j $ compNeg i (e @@ i) (trans i (e @@ i) y) -- (mkSystem [(j ~> 0, transFill j (e @@ j) y) -- ,(j ~> 1, transFillNeg j (e @@ j) -- (trans j (e @@ j) y))]) -- t e x = VPLam j $ comp i (e @@ i) (transNeg i (e @@ i) x) -- (mkSystem [(j ~> 0, transFill j (e @@ j) -- (transNeg j (e @@ j) x)) -- ,(j ~> 1, transFillNeg j (e @@ j) x)]) -- gv = g eq v -- us' = mapWithKey (\alpha uAlpha -> -- t (eq `face` alpha) uAlpha @@ i) us -- theta = fill i a gv us' -- u = comp i a gv us' -- Same as "theta `face` (i ~> 1)" -- ws = insertSystem (i ~> 0) gv $ -- insertSystem (i ~> 1) (t eq u @@ j) $ -- mapWithKey -- (\alpha uAlpha -> -- t (eq `face` alpha) uAlpha @@ (Atom i :/\: Atom j)) us -- theta' = compNeg j a theta ws -- xs = insertSystem (i ~> 0) (s eq v @@ j) $ -- insertSystem (i ~> 1) (s eq (f eq u) @@ j) $ -- mapWithKey -- (\alpha uAlpha -> -- s (eq `face` alpha) (f (eq `face` alpha) uAlpha) @@ j) us -- theta'' = comp j b (f eq theta') xs ------------------------------------------------------------------------------- -- | Conversion
5,949
lemEq eq b aps = (a,VPLam i (compNeg j (eq @@ j) p1 thetas')) where i:j:_ = freshs (eq,b,aps) ta = eq @@ One p1s = mapWithKey (\alpha (aa,pa) -> let eqaj = (eq `face` alpha) @@ j ba = b `face` alpha in comp j eqaj (pa @@ i) (mkSystem [ (i~>0,transFill j eqaj ba) , (i~>1,transFillNeg j eqaj aa)])) aps thetas = mapWithKey (\alpha (aa,pa) -> let eqaj = (eq `face` alpha) @@ j ba = b `face` alpha in fill j eqaj (pa @@ i) (mkSystem [ (i~>0,transFill j eqaj ba) , (i~>1,transFillNeg j eqaj aa)])) aps a = comp i ta (trans i (eq @@ i) b) p1s p1 = fill i ta (trans i (eq @@ i) b) p1s thetas' = insertsSystem [ (i ~> 0,transFill j (eq @@ j) b) , (i ~> 1,transFillNeg j (eq @@ j) a)] thetas -- Old version: -- This version triggers the following error when checking the normal form of corrUniv: -- Parsed "examples/nunivalence2.ctt" successfully! -- Resolver failed: Cannot resolve name !3 at position (7,30062) in module nunivalence2 -- compU :: Name -> Val -> System Val -> Val -> System Val -> Val -- compU i b es wi0 ws = glueElem vi1'' usi1'' -- where bi1 = b `face` (i ~> 1) -- vs = mapWithKey (\alpha wAlpha -> -- unGlueU wAlpha (b `face` alpha) (es `face` alpha)) ws -- vsi1 = vs `face` (i ~> 1) -- same as: border vi1 vs -- vi0 = unGlueU wi0 (b `face` (i ~> 0)) (es `face` (i ~> 0)) -- in b(i0) -- v = fill i b vi0 vs -- in b -- vi1 = comp i b vi0 vs -- is v `face` (i ~> 1) in b(i1) -- esI1 = es `face` (i ~> 1) -- es' = filterWithKey (\alpha _ -> i `Map.notMember` alpha) es -- es'' = filterWithKey (\alpha _ -> alpha `Map.notMember` es) esI1 -- us' = mapWithKey (\gamma eGamma -> -- fill i (eGamma @@ One) (wi0 `face` gamma) (ws `face` gamma)) -- es' -- usi1' = mapWithKey (\gamma eGamma -> -- comp i (eGamma @@ One) (wi0 `face` gamma) (ws `face` gamma)) -- es' -- ls' = mapWithKey (\gamma eGamma -> -- pathComp i (b `face` gamma) (v `face` gamma) -- (transNegLine eGamma (us' ! gamma)) (vs `face` gamma)) -- es' -- vi1' = compLine (constPath bi1) vi1 -- (ls' `unionSystem` Map.map constPath vsi1) -- wsi1 = ws `face` (i ~> 1) -- -- for gamma in es'', (i1) gamma is in es, so wsi1 gamma -- -- is in the domain of isoGamma -- uls'' = mapWithKey (\gamma eGamma -> -- gradLemmaU (bi1 `face` gamma) eGamma -- ((usi1' `face` gamma) `unionSystem` (wsi1 `face` gamma)) -- (vi1' `face` gamma)) -- es'' -- vsi1' = Map.map constPath $ border vi1' es' `unionSystem` vsi1 -- vi1'' = compLine (constPath bi1) vi1' -- (Map.map snd uls'' `unionSystem` vsi1') -- usi1'' = Map.mapWithKey (\gamma _ -> -- if gamma `Map.member` usi1' then usi1' ! gamma -- else fst (uls'' ! gamma)) -- esI1 -- Grad Lemma, takes a line eq in U, a system us and a value v, s.t. f us = -- border v. Outputs (u,p) s.t. border u = us and a path p between v -- and f u, where f is transNegLine eq -- gradLemmaU :: Val -> Val -> System Val -> Val -> (Val, Val) -- gradLemmaU b eq us v = (u, VPLam i theta) -- where i:j:_ = freshs (b,eq,us,v) -- ej = eq @@ j -- a = eq @@ One -- ws = mapWithKey (\alpha uAlpha -> -- transFillNeg j (ej `face` alpha) uAlpha) us -- u = comp j ej v ws -- w = fill j ej v ws -- xs = insertSystem (i ~> 0) w $ -- insertSystem (i ~> 1) (transFillNeg j ej u) $ ws -- theta = compNeg j ej u xs -- Old version: -- gradLemmaU :: Val -> Val -> System Val -> Val -> (Val, Val) -- gradLemmaU b eq us v = (u, VPLam i theta'') -- where i:j:_ = freshs (b,eq,us,v) -- a = eq @@ One -- g = transLine -- f = transNegLine -- s e y = VPLam j $ compNeg i (e @@ i) (trans i (e @@ i) y) -- (mkSystem [(j ~> 0, transFill j (e @@ j) y) -- ,(j ~> 1, transFillNeg j (e @@ j) -- (trans j (e @@ j) y))]) -- t e x = VPLam j $ comp i (e @@ i) (transNeg i (e @@ i) x) -- (mkSystem [(j ~> 0, transFill j (e @@ j) -- (transNeg j (e @@ j) x)) -- ,(j ~> 1, transFillNeg j (e @@ j) x)]) -- gv = g eq v -- us' = mapWithKey (\alpha uAlpha -> -- t (eq `face` alpha) uAlpha @@ i) us -- theta = fill i a gv us' -- u = comp i a gv us' -- Same as "theta `face` (i ~> 1)" -- ws = insertSystem (i ~> 0) gv $ -- insertSystem (i ~> 1) (t eq u @@ j) $ -- mapWithKey -- (\alpha uAlpha -> -- t (eq `face` alpha) uAlpha @@ (Atom i :/\: Atom j)) us -- theta' = compNeg j a theta ws -- xs = insertSystem (i ~> 0) (s eq v @@ j) $ -- insertSystem (i ~> 1) (s eq (f eq u) @@ j) $ -- mapWithKey -- (\alpha uAlpha -> -- s (eq `face` alpha) (f (eq `face` alpha) uAlpha) @@ j) us -- theta'' = comp j b (f eq theta') xs ------------------------------------------------------------------------------- -- | Conversion
5,896
false
true
11
15
2,408
615
357
258
null
null
ryzhyk/cocoon
cocoon/SMT/SMTLib2.hs
apache-2.0
z3Config = SMT2Config {s2Solver = "z3", s2Opts = ["-smt2", "-in"]}
66
z3Config = SMT2Config {s2Solver = "z3", s2Opts = ["-smt2", "-in"]}
66
z3Config = SMT2Config {s2Solver = "z3", s2Opts = ["-smt2", "-in"]}
66
false
false
0
7
9
26
16
10
null
null
cdornan/keystore
src/Data/KeyStore/CLI/Command.hs
bsd-3-clause
p_no_debug_flg :: Parser Bool p_no_debug_flg = flag' False $ long "no-debug" <> short 'q' <> help "disable debug logging"
146
p_no_debug_flg :: Parser Bool p_no_debug_flg = flag' False $ long "no-debug" <> short 'q' <> help "disable debug logging"
146
p_no_debug_flg = flag' False $ long "no-debug" <> short 'q' <> help "disable debug logging"
116
false
true
7
5
43
45
17
28
null
null
mcschroeder/todo-example
Database.hs
mit
createList :: TX DB List createList = do listId <- unsafeIOToTX randomIO now <- unsafeIOToTX getCurrentTime let list = List { listItems = IntMap.empty , listCreatedAt = now , listUpdatedAt = now , listVersion = 1 , .. } _createList list return list
348
createList :: TX DB List createList = do listId <- unsafeIOToTX randomIO now <- unsafeIOToTX getCurrentTime let list = List { listItems = IntMap.empty , listCreatedAt = now , listUpdatedAt = now , listVersion = 1 , .. } _createList list return list
348
createList = do listId <- unsafeIOToTX randomIO now <- unsafeIOToTX getCurrentTime let list = List { listItems = IntMap.empty , listCreatedAt = now , listUpdatedAt = now , listVersion = 1 , .. } _createList list return list
323
false
true
0
12
142
88
44
44
null
null
Helkafen/cabal
cabal-install/Distribution/Client/Dependency/TopDown.hs
bsd-3-clause
showExclusionReason pkgid (ExcludedByTopLevelConstraintVersion pkgname verRange) = display pkgid ++ " was excluded because of the top level constraint " ++ displayDep (Dependency pkgname verRange)
200
showExclusionReason pkgid (ExcludedByTopLevelConstraintVersion pkgname verRange) = display pkgid ++ " was excluded because of the top level constraint " ++ displayDep (Dependency pkgname verRange)
200
showExclusionReason pkgid (ExcludedByTopLevelConstraintVersion pkgname verRange) = display pkgid ++ " was excluded because of the top level constraint " ++ displayDep (Dependency pkgname verRange)
200
false
false
2
6
27
44
19
25
null
null
k00mi/mqtt-hs
Network/MQTT/Internal.hs
gpl-3.0
getSome :: MonadIO m => Config -> Handle -> m ByteString getSome mqtt h = liftIO (BS.hGetSome h (cInputBufferSize mqtt))
120
getSome :: MonadIO m => Config -> Handle -> m ByteString getSome mqtt h = liftIO (BS.hGetSome h (cInputBufferSize mqtt))
120
getSome mqtt h = liftIO (BS.hGetSome h (cInputBufferSize mqtt))
63
false
true
0
9
19
53
25
28
null
null
brendanhay/gogol
gogol-dlp/gen/Network/Google/DLP/Types/Product.hs
mpl-2.0
-- | The status code, which should be an enum value of google.rpc.Code. grsCode :: Lens' GoogleRpcStatus (Maybe Int32) grsCode = lens _grsCode (\ s a -> s{_grsCode = a}) . mapping _Coerce
195
grsCode :: Lens' GoogleRpcStatus (Maybe Int32) grsCode = lens _grsCode (\ s a -> s{_grsCode = a}) . mapping _Coerce
123
grsCode = lens _grsCode (\ s a -> s{_grsCode = a}) . mapping _Coerce
76
true
true
0
10
40
55
28
27
null
null
bsl/language-dot
src/Language/Dot/Parser.hs
bsd-3-clause
parseSubgraph :: Parser Subgraph parseSubgraph = ( try parseNewSubgraph <|> parseSubgraphRef ) <?> "subgraph"
131
parseSubgraph :: Parser Subgraph parseSubgraph = ( try parseNewSubgraph <|> parseSubgraphRef ) <?> "subgraph"
131
parseSubgraph = ( try parseNewSubgraph <|> parseSubgraphRef ) <?> "subgraph"
98
false
true
0
8
35
28
14
14
null
null
rubenpieters/gre-project
shared/src/GameState.hs
bsd-3-clause
evalCE :: (MonadState GameState m, MonadWriter [String] m, MonadIO m) => Program CardEffectOp a -> Origin -> m a evalCE p o = flip evalCE' o $ view p
156
evalCE :: (MonadState GameState m, MonadWriter [String] m, MonadIO m) => Program CardEffectOp a -> Origin -> m a evalCE p o = flip evalCE' o $ view p
156
evalCE p o = flip evalCE' o $ view p
36
false
true
0
9
35
77
36
41
null
null
msakai/icfpc2013
src/BV.hs
bsd-2-clause
xor' = Op2 XOR
14
xor' = Op2 XOR
14
xor' = Op2 XOR
14
false
false
0
5
3
9
4
5
null
null
phaazon/OpenGLRaw
src/Graphics/Rendering/OpenGL/Raw/Tokens.hs
bsd-3-clause
gl_MAX_DEFORMATION_ORDER_SGIX :: GLenum gl_MAX_DEFORMATION_ORDER_SGIX = 0x8197
78
gl_MAX_DEFORMATION_ORDER_SGIX :: GLenum gl_MAX_DEFORMATION_ORDER_SGIX = 0x8197
78
gl_MAX_DEFORMATION_ORDER_SGIX = 0x8197
38
false
true
0
4
5
11
6
5
null
null
ssaavedra/liquidhaskell
src/Language/Haskell/Liquid/Parse.hs
bsd-3-clause
hboundP :: Parser LocSymbol hboundP = locParserP binderP
56
hboundP :: Parser LocSymbol hboundP = locParserP binderP
56
hboundP = locParserP binderP
28
false
true
0
5
7
17
8
9
null
null
droundy/franchise
Distribution/Franchise/ListUtils.hs
bsd-3-clause
-- | Checks if a string ends with any given suffix endsWithOneOf :: [String] -- ^ List of strings to check -> String -- ^ String to check against -> Bool endsWithOneOf xs y = any (`isSuffixOf` y) xs
228
endsWithOneOf :: [String] -- ^ List of strings to check -> String -- ^ String to check against -> Bool endsWithOneOf xs y = any (`isSuffixOf` y) xs
177
endsWithOneOf xs y = any (`isSuffixOf` y) xs
44
true
true
0
6
68
41
24
17
null
null
bennofs/cabal
cabal-install/Distribution/Client/ProjectOrchestration.hs
bsd-3-clause
reportBuildTargetProblem :: BuildTargetProblem -> String reportBuildTargetProblem (BuildTargetNotInProject pn) = "Cannot build the package " ++ display pn ++ ", it is not in this project." ++ "(either directly or indirectly). If you want to add it to the " ++ "project then edit the cabal.project file."
321
reportBuildTargetProblem :: BuildTargetProblem -> String reportBuildTargetProblem (BuildTargetNotInProject pn) = "Cannot build the package " ++ display pn ++ ", it is not in this project." ++ "(either directly or indirectly). If you want to add it to the " ++ "project then edit the cabal.project file."
321
reportBuildTargetProblem (BuildTargetNotInProject pn) = "Cannot build the package " ++ display pn ++ ", it is not in this project." ++ "(either directly or indirectly). If you want to add it to the " ++ "project then edit the cabal.project file."
264
false
true
4
7
63
46
21
25
null
null
frantisekfarka/ghc-dsi
compiler/codeGen/StgCmmUtils.hs
bsd-3-clause
newByteStringCLit :: [Word8] -> FCode CmmLit newByteStringCLit bytes = do { uniq <- newUnique ; let (lit, decl) = mkByteStringCLit uniq bytes ; emitDecl decl ; return lit }
199
newByteStringCLit :: [Word8] -> FCode CmmLit newByteStringCLit bytes = do { uniq <- newUnique ; let (lit, decl) = mkByteStringCLit uniq bytes ; emitDecl decl ; return lit }
199
newByteStringCLit bytes = do { uniq <- newUnique ; let (lit, decl) = mkByteStringCLit uniq bytes ; emitDecl decl ; return lit }
154
false
true
0
10
55
69
34
35
null
null
mariefarrell/Hets
CspCASLProver/CspProverConsts.hs
gpl-2.0
cspProver_chan_recAltArgPrios :: [Int] cspProver_chan_recAltArgPrios = [900, 900, 1000, 80]
91
cspProver_chan_recAltArgPrios :: [Int] cspProver_chan_recAltArgPrios = [900, 900, 1000, 80]
91
cspProver_chan_recAltArgPrios = [900, 900, 1000, 80]
52
false
true
0
5
8
26
16
10
null
null
martindavid/code-sandbox
comp90048/assignments/project1/attempt2/Proj1.hs
mit
safeTail (x:xs) = xs
20
safeTail (x:xs) = xs
20
safeTail (x:xs) = xs
20
false
false
0
7
3
16
8
8
null
null
silky/super-reference
Application.hs
mit
makeApplication :: App -> IO Application makeApplication foundation = do logWare <- mkRequestLogger def { outputFormat = if appDetailedRequestLogging $ appSettings foundation then Detailed True else Apache (if appIpFromHeader $ appSettings foundation then FromFallback else FromSocket) , destination = Logger $ loggerSet $ appLogger foundation } -- Create the WAI application and apply middlewares appPlain <- toWaiAppPlain foundation return $ logWare $ defaultMiddlewaresNoLogging appPlain -- | Warp settings for the given foundation value.
707
makeApplication :: App -> IO Application makeApplication foundation = do logWare <- mkRequestLogger def { outputFormat = if appDetailedRequestLogging $ appSettings foundation then Detailed True else Apache (if appIpFromHeader $ appSettings foundation then FromFallback else FromSocket) , destination = Logger $ loggerSet $ appLogger foundation } -- Create the WAI application and apply middlewares appPlain <- toWaiAppPlain foundation return $ logWare $ defaultMiddlewaresNoLogging appPlain -- | Warp settings for the given foundation value.
707
makeApplication foundation = do logWare <- mkRequestLogger def { outputFormat = if appDetailedRequestLogging $ appSettings foundation then Detailed True else Apache (if appIpFromHeader $ appSettings foundation then FromFallback else FromSocket) , destination = Logger $ loggerSet $ appLogger foundation } -- Create the WAI application and apply middlewares appPlain <- toWaiAppPlain foundation return $ logWare $ defaultMiddlewaresNoLogging appPlain -- | Warp settings for the given foundation value.
666
false
true
0
17
238
125
61
64
null
null
audetto/andsoft
haskell/Elves/Exp.hs
gpl-3.0
mkArray :: IntE -> (IntE -> Exp a) -> ArrayE a mkArray (E size) item = let usedVars = freeE (item (E Dummy)) -- apply item to dummy to get the free variables of item id = freshVariable usedVars "it" dummy = varIntE id (E expr) = item dummy in E (MkArray id size expr)
399
mkArray :: IntE -> (IntE -> Exp a) -> ArrayE a mkArray (E size) item = let usedVars = freeE (item (E Dummy)) -- apply item to dummy to get the free variables of item id = freshVariable usedVars "it" dummy = varIntE id (E expr) = item dummy in E (MkArray id size expr)
397
mkArray (E size) item = let usedVars = freeE (item (E Dummy)) -- apply item to dummy to get the free variables of item id = freshVariable usedVars "it" dummy = varIntE id (E expr) = item dummy in E (MkArray id size expr)
350
false
true
0
13
186
120
57
63
null
null
piyush-kurur/shakespeare
shakespeare-css/Text/MkSizeType.hs
bsd-2-clause
dataDec :: Name -> Dec dataDec name = DataD [] name [] [constructor] derives where constructor = NormalC name [(NotStrict, ConT $ mkName "Rational")] derives = map mkName ["Eq", "Ord"]
194
dataDec :: Name -> Dec dataDec name = DataD [] name [] [constructor] derives where constructor = NormalC name [(NotStrict, ConT $ mkName "Rational")] derives = map mkName ["Eq", "Ord"]
194
dataDec name = DataD [] name [] [constructor] derives where constructor = NormalC name [(NotStrict, ConT $ mkName "Rational")] derives = map mkName ["Eq", "Ord"]
171
false
true
0
9
39
86
43
43
null
null
olsner/ghc
compiler/prelude/TysPrim.hs
bsd-3-clause
weakPrimTyConName = mkPrimTc (fsLit "Weak#") weakPrimTyConKey weakPrimTyCon
87
weakPrimTyConName = mkPrimTc (fsLit "Weak#") weakPrimTyConKey weakPrimTyCon
87
weakPrimTyConName = mkPrimTc (fsLit "Weak#") weakPrimTyConKey weakPrimTyCon
87
false
false
0
7
18
19
9
10
null
null
input-output-hk/pos-haskell-prototype
wallet/src/Cardano/Wallet/Kernel/DB/Util/IxSet.hs
mit
{------------------------------------------------------------------------------- Creation -------------------------------------------------------------------------------} empty :: Indexable a => IxSet a empty = coerce IxSet.empty
232
empty :: Indexable a => IxSet a empty = coerce IxSet.empty
58
empty = coerce IxSet.empty
26
true
true
0
7
16
33
14
19
null
null
rodrigo-machado/verigraph
src/library/XML/GGXWriter.hs
gpl-3.0
writeNode :: ArrowXml a => String -> ParsedTypedNode -> a XmlTree XmlTree writeNode graphId (nodeId, objName, nodeType) = mkelem "Node" ([ sattr "ID" (graphId++"_"++nodeId) ] ++ writeObjName objName ++ [ sattr "type" nodeType ]) [ writeDefaultNodeLayout, writeAdditionalNodeLayout ]
299
writeNode :: ArrowXml a => String -> ParsedTypedNode -> a XmlTree XmlTree writeNode graphId (nodeId, objName, nodeType) = mkelem "Node" ([ sattr "ID" (graphId++"_"++nodeId) ] ++ writeObjName objName ++ [ sattr "type" nodeType ]) [ writeDefaultNodeLayout, writeAdditionalNodeLayout ]
299
writeNode graphId (nodeId, objName, nodeType) = mkelem "Node" ([ sattr "ID" (graphId++"_"++nodeId) ] ++ writeObjName objName ++ [ sattr "type" nodeType ]) [ writeDefaultNodeLayout, writeAdditionalNodeLayout ]
225
false
true
0
12
54
101
51
50
null
null
feuerbach/prover
src/Lexer.hs
mit
lSpace :: Lexer Token lSpace = fold [ whitespace $ longest $ some $ psym isSpace , whitespace $ longestShortest (string "--") (const $ many anySym *> sym nl) ] where nl = '\n'
183
lSpace :: Lexer Token lSpace = fold [ whitespace $ longest $ some $ psym isSpace , whitespace $ longestShortest (string "--") (const $ many anySym *> sym nl) ] where nl = '\n'
183
lSpace = fold [ whitespace $ longest $ some $ psym isSpace , whitespace $ longestShortest (string "--") (const $ many anySym *> sym nl) ] where nl = '\n'
161
false
true
0
11
41
78
38
40
null
null
phaazon/OpenGLRaw
src/Graphics/Rendering/OpenGL/Raw/Tokens.hs
bsd-3-clause
gl_GEOMETRY_LINKED_INPUT_TYPE_OES :: GLenum gl_GEOMETRY_LINKED_INPUT_TYPE_OES = 0x8917
86
gl_GEOMETRY_LINKED_INPUT_TYPE_OES :: GLenum gl_GEOMETRY_LINKED_INPUT_TYPE_OES = 0x8917
86
gl_GEOMETRY_LINKED_INPUT_TYPE_OES = 0x8917
42
false
true
0
4
5
11
6
5
null
null
mitchellwrosen/language-lua2
src/Language/Lua/Token.hs
bsd-3-clause
showToken TkExponent = "^"
31
showToken TkExponent = "^"
31
showToken TkExponent = "^"
31
false
false
0
5
8
9
4
5
null
null
alexvong1995/pandoc
src/Text/Pandoc/Writers/Docbook.hs
gpl-2.0
-- | Convert Pandoc document to string in Docbook format. writeDocbook :: WriterOptions -> Pandoc -> String writeDocbook opts (Pandoc meta blocks) = let elements = hierarchicalize blocks colwidth = if writerWrapText opts then Just $ writerColumns opts else Nothing render' = render colwidth opts' = if "/book>" `isSuffixOf` (trimr $ writerTemplate opts) then opts{ writerChapters = True } else opts startLvl = if writerChapters opts' then 0 else 1 auths' = map (authorToDocbook opts) $ docAuthors meta meta' = B.setMeta "author" auths' meta Just metadata = metaToJSON opts (Just . render colwidth . (vcat . (map (elementToDocbook opts' startLvl)) . hierarchicalize)) (Just . render colwidth . inlinesToDocbook opts') meta' main = render' $ vcat (map (elementToDocbook opts' startLvl) elements) context = defField "body" main $ defField "mathml" (case writerHTMLMathMethod opts of MathML _ -> True _ -> False) $ metadata in if writerStandalone opts then renderTemplate' (writerTemplate opts) context else main
1,382
writeDocbook :: WriterOptions -> Pandoc -> String writeDocbook opts (Pandoc meta blocks) = let elements = hierarchicalize blocks colwidth = if writerWrapText opts then Just $ writerColumns opts else Nothing render' = render colwidth opts' = if "/book>" `isSuffixOf` (trimr $ writerTemplate opts) then opts{ writerChapters = True } else opts startLvl = if writerChapters opts' then 0 else 1 auths' = map (authorToDocbook opts) $ docAuthors meta meta' = B.setMeta "author" auths' meta Just metadata = metaToJSON opts (Just . render colwidth . (vcat . (map (elementToDocbook opts' startLvl)) . hierarchicalize)) (Just . render colwidth . inlinesToDocbook opts') meta' main = render' $ vcat (map (elementToDocbook opts' startLvl) elements) context = defField "body" main $ defField "mathml" (case writerHTMLMathMethod opts of MathML _ -> True _ -> False) $ metadata in if writerStandalone opts then renderTemplate' (writerTemplate opts) context else main
1,324
writeDocbook opts (Pandoc meta blocks) = let elements = hierarchicalize blocks colwidth = if writerWrapText opts then Just $ writerColumns opts else Nothing render' = render colwidth opts' = if "/book>" `isSuffixOf` (trimr $ writerTemplate opts) then opts{ writerChapters = True } else opts startLvl = if writerChapters opts' then 0 else 1 auths' = map (authorToDocbook opts) $ docAuthors meta meta' = B.setMeta "author" auths' meta Just metadata = metaToJSON opts (Just . render colwidth . (vcat . (map (elementToDocbook opts' startLvl)) . hierarchicalize)) (Just . render colwidth . inlinesToDocbook opts') meta' main = render' $ vcat (map (elementToDocbook opts' startLvl) elements) context = defField "body" main $ defField "mathml" (case writerHTMLMathMethod opts of MathML _ -> True _ -> False) $ metadata in if writerStandalone opts then renderTemplate' (writerTemplate opts) context else main
1,274
true
true
0
18
525
338
171
167
null
null
mpickering/slack-api
src/Web/Slack/WebAPI.hs
mit
rtm_start :: (MonadError T.Text m, MonadIO m) => SlackConfig -> m (T.Text, SlackSession) rtm_start conf = do resp <- makeSlackCall conf "rtm.start" id url <- resp ^? key "url" . _String ?? "rtm_start: No url!" sessionInfo <- fromJSON' resp return (url, sessionInfo)
293
rtm_start :: (MonadError T.Text m, MonadIO m) => SlackConfig -> m (T.Text, SlackSession) rtm_start conf = do resp <- makeSlackCall conf "rtm.start" id url <- resp ^? key "url" . _String ?? "rtm_start: No url!" sessionInfo <- fromJSON' resp return (url, sessionInfo)
293
rtm_start conf = do resp <- makeSlackCall conf "rtm.start" id url <- resp ^? key "url" . _String ?? "rtm_start: No url!" sessionInfo <- fromJSON' resp return (url, sessionInfo)
192
false
true
0
12
69
111
52
59
null
null
Dnomyar/sha3
src/Main.hs
mit
chi :: [[Int]] -> [[Int]] chi b = transpose $ map manageLine $ transpose b where manageLine line = map (\(lineR0, (lineR1, lineR2)) -> xor lineR0 ((notB lineR1) .&. lineR2)) $ zip line $ zip (rotateList 1 line) (rotateList 2 line)
242
chi :: [[Int]] -> [[Int]] chi b = transpose $ map manageLine $ transpose b where manageLine line = map (\(lineR0, (lineR1, lineR2)) -> xor lineR0 ((notB lineR1) .&. lineR2)) $ zip line $ zip (rotateList 1 line) (rotateList 2 line)
242
chi b = transpose $ map manageLine $ transpose b where manageLine line = map (\(lineR0, (lineR1, lineR2)) -> xor lineR0 ((notB lineR1) .&. lineR2)) $ zip line $ zip (rotateList 1 line) (rotateList 2 line)
216
false
true
0
14
52
133
67
66
null
null
GaloisInc/saw-script
src/SAWScript/MGU.hs
bsd-3-clause
checkE :: LName -> Expr -> Type -> TI OutExpr checkE m e t = do (e',t') <- inferE (m,e) unify m t t' return e'
116
checkE :: LName -> Expr -> Type -> TI OutExpr checkE m e t = do (e',t') <- inferE (m,e) unify m t t' return e'
116
checkE m e t = do (e',t') <- inferE (m,e) unify m t t' return e'
70
false
true
0
9
31
71
34
37
null
null
spechub/Hets
OWL2/PrintAS.hs
gpl-2.0
printOntologyDocument :: OntologyDocument -> Doc printOntologyDocument (OntologyDocument _ prefDecls ont) = (vsep . map printPrefixDeclaration $ M.toList prefDecls) $+$ printOnt prefDecls ont
196
printOntologyDocument :: OntologyDocument -> Doc printOntologyDocument (OntologyDocument _ prefDecls ont) = (vsep . map printPrefixDeclaration $ M.toList prefDecls) $+$ printOnt prefDecls ont
196
printOntologyDocument (OntologyDocument _ prefDecls ont) = (vsep . map printPrefixDeclaration $ M.toList prefDecls) $+$ printOnt prefDecls ont
147
false
true
0
9
26
56
27
29
null
null
ku-fpg/better-life
Reference/Original_Life.hs
bsd-2-clause
liveneighbs :: Board -> Pos -> Int liveneighbs b = length . filter (isAlive b) . neighbs
127
liveneighbs :: Board -> Pos -> Int liveneighbs b = length . filter (isAlive b) . neighbs
123
liveneighbs b = length . filter (isAlive b) . neighbs
70
false
true
0
9
55
41
19
22
null
null
noinia/damokles
src/Main.hs
bsd-3-clause
days NL = "dagen"
17
days NL = "dagen"
17
days NL = "dagen"
17
false
false
1
5
3
13
4
9
null
null
melted/llvm-pretty
src/Text/LLVM.hs
bsd-3-clause
emptyRW :: RW emptyRW = RW { rwNames = Map.empty , rwLabel = Nothing , rwStmts = Seq.empty }
101
emptyRW :: RW emptyRW = RW { rwNames = Map.empty , rwLabel = Nothing , rwStmts = Seq.empty }
101
emptyRW = RW { rwNames = Map.empty , rwLabel = Nothing , rwStmts = Seq.empty }
87
false
true
0
8
27
39
22
17
null
null
jyp/inox
Inox.hs
gpl-3.0
run (Run e (ClosedComputation e' x c) (ForceWith u)) = run' (Map.insert x clo e') c -- TODO: check `_mt` is empty? where (clo,_mt) = MS.runState (close u) e
162
run (Run e (ClosedComputation e' x c) (ForceWith u)) = run' (Map.insert x clo e') c -- TODO: check `_mt` is empty? where (clo,_mt) = MS.runState (close u) e
162
run (Run e (ClosedComputation e' x c) (ForceWith u)) = run' (Map.insert x clo e') c -- TODO: check `_mt` is empty? where (clo,_mt) = MS.runState (close u) e
162
false
false
0
9
34
80
40
40
null
null