AsToLe.hs revision f353be6210f67ffd4a46967bba749afc968cee52
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
{- |
Module : $Header$
Copyright : (c) Christian Maeder and Uni Bremen 2003
Licence : similar to LGPL, see HetCATS/LICENCE.txt or LIZENZ.txt
Maintainer : hets@tzi.de
Stability : experimental
Portability : portable
conversion from As to Le
-}
module HasCASL.AsToLe where
import Common.AS_Annotation
import Common.GlobalAnnotations
import Common.Lib.State
import qualified Common.Lib.Map as Map
import qualified Common.Lib.Set as Set
import Common.Result
import Common.Id
import HasCASL.As
import HasCASL.AsToIds
import HasCASL.Le
import HasCASL.ClassDecl
import HasCASL.VarDecl
import HasCASL.Unify
import HasCASL.OpDecl
import HasCASL.TypeDecl
import HasCASL.TypeCheck
import HasCASL.MixAna
import Data.Maybe
import Data.List
-- | basic analysis
basicAnalysis :: (BasicSpec, Env, GlobalAnnos) ->
Result (BasicSpec, Env, Env, [Named Term])
basicAnalysis (b, e, ga) =
let (nb, ne) = runState (anaBasicSpec ga b) e
ce = cleanEnv ne
in Result (reverse $ envDiags ne) $
Just (nb, diffEnv ce e, ce, reverse $ sentences ne)
-- | compute difference of signatures
diffEnv :: Env -> Env -> Env
diffEnv e1 e2 = let tm = typeMap e2 in
initialEnv
{ classMap = Map.differenceWith diffClass (classMap e1) (classMap e2)
, typeMap = Map.differenceWith diffType (typeMap e1) tm
, assumps = Map.differenceWith (diffAss tm) (assumps e1) (assumps e2)
}
-- | compute difference of class infos
diffClass :: ClassInfo -> ClassInfo -> Maybe ClassInfo
diffClass _ _ = Nothing
-- | compute difference of type infos
diffType :: TypeInfo -> TypeInfo -> Maybe TypeInfo
diffType _ _ = Nothing
-- | Check if two OpTypes are equal except from totality or partiality
compatibleOpTypes :: TypeScheme -> TypeScheme -> Bool
compatibleOpTypes = isUnifiable Map.empty 0
-- | compute difference of overloaded operations
diffAss :: TypeMap -> OpInfos -> OpInfos -> Maybe OpInfos
diffAss tm (OpInfos l1) (OpInfos l2) =
let l3 = diffOps l1 l2 in
if null l3 then Nothing else Just (OpInfos l3)
where diffOps [] _ = []
diffOps (o:os) ps =
let rs = diffOps os ps in
if any (\ p -> isUnifiable tm 0 (opType o) (opType p)) ps
then rs else o:rs
-- | clean up finally accumulated environment
cleanEnv :: Env -> Env
cleanEnv e = diffEnv initialEnv
{ classMap = classMap e
, typeMap = Map.filter (not . isTypeVarDefn) (typeMap e)
, assumps = filterAssumps (not . isVarDefn) (assumps e) }
preEnv
-- | environment with predefined types and operations
preEnv :: Env
preEnv = initialEnv { typeMap = addUnit Map.empty
, assumps = addOps Map.empty }
addPreIds :: (PrecMap, Set.Set Id) -> State Env ()
addPreIds r = do e <- get
put e { preIds = r }
-- | analyse basic spec
anaBasicSpec :: GlobalAnnos -> BasicSpec -> State Env BasicSpec
anaBasicSpec ga b@(BasicSpec l) = do
tm <- gets typeMap
as <- gets assumps
putTypeMap $ addUnit tm
putAssumps $ addOps as
newAs <- gets assumps
let preds = Set.fromDistinctAscList
$ Map.keys $ Map.filter (any ( \ oi ->
case opDefn oi of
NoOpDefn Pred -> True
Definition Pred _ -> True
_ -> False) . opInfos) newAs
newPreds = idsOfBasicSpec b
rels = Set.union preds newPreds
newGa = addBuiltins ga
precs = mkPrecIntMap $ prec_annos newGa
addPreIds (precs, rels)
ul <- mapAnM (anaBasicItem newGa) l
return $ BasicSpec ul
-- | analyse basic item
anaBasicItem :: GlobalAnnos -> BasicItem -> State Env BasicItem
anaBasicItem ga (SigItems i) = fmap SigItems $ anaSigItems ga Loose i
anaBasicItem ga (ClassItems inst l ps) =
do ul <- mapAnM (anaClassItem ga inst) l
return $ ClassItems inst ul ps
anaBasicItem _ (GenVarItems l ps) =
do ul <- mapM anaGenVarDecl l
return $ GenVarItems (catMaybes ul) ps
anaBasicItem ga (ProgItems l ps) =
do ul <- mapAnM (anaProgEq ga) l
return $ ProgItems ul ps
anaBasicItem _ (FreeDatatype l ps) =
do al <- mapAnMaybe ana1Datatype l
let tys = map (dataPatToType . item) al
ul <- mapAnM (anaDatatype Free Plain tys) al
return $ FreeDatatype ul ps
anaBasicItem ga (GenItems l ps) =
do ul <- mapAnM (anaSigItems ga Generated) l
return $ GenItems ul ps
anaBasicItem ga (AxiomItems decls fs ps) =
do tm <- gets typeMap -- save type map
as <- gets assumps -- save vars
ds <- mapM anaGenVarDecl decls
ts <- mapM (anaFormula ga) fs
putTypeMap tm -- restore
putAssumps as -- restore
let newFs = catMaybes ts
sens = map ( \ f -> NamedSen (getRLabel f) $ item f) newFs
appendSentences sens
return $ AxiomItems (catMaybes ds) newFs ps
anaBasicItem ga (Internal l ps) =
do ul <- mapAnM (anaBasicItem ga) l
return $ Internal ul ps
-- | add sentences
appendSentences :: [Named Term] -> State Env ()
appendSentences fs =
do e <- get
put $ e {sentences = sentences e ++ fs}
-- | analyse sig items
anaSigItems :: GlobalAnnos -> GenKind -> SigItems -> State Env SigItems
anaSigItems ga gk (TypeItems inst l ps) =
do ul <- anaTypeItems ga gk inst l
return $ TypeItems inst ul ps
anaSigItems ga _ (OpItems b l ps) =
do ul <- mapAnM (anaOpItem ga b) l
return $ OpItems b ul ps
-- | analyse a class item
anaClassItem :: GlobalAnnos -> Instance -> ClassItem
-> State Env ClassItem
anaClassItem ga _ (ClassItem d l ps) =
do cd <- anaClassDecls d
ul <- mapAnM (anaBasicItem ga) l
return $ ClassItem cd ul ps