-
Notifications
You must be signed in to change notification settings - Fork 19
/
Copy pathAnalysisArchitecture.hs
503 lines (461 loc) · 25.1 KB
/
AnalysisArchitecture.hs
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
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
263
264
265
266
267
268
269
270
271
272
273
274
275
276
277
278
279
280
281
282
283
284
285
286
287
288
289
290
291
292
293
294
295
296
297
298
299
300
301
302
303
304
305
306
307
308
309
310
311
312
313
314
315
316
317
318
319
320
321
322
323
324
325
326
327
328
329
330
331
332
333
334
335
336
337
338
339
340
341
342
343
344
345
346
347
348
349
350
351
352
353
354
355
356
357
358
359
360
361
362
363
364
365
366
367
368
369
370
371
372
373
374
375
376
377
378
379
380
381
382
383
384
385
386
387
388
389
390
391
392
393
394
395
396
397
398
399
400
401
402
403
404
405
406
407
408
409
410
411
412
413
414
415
416
417
418
419
420
421
422
423
424
425
426
427
428
429
430
431
432
433
434
435
436
437
438
439
440
441
442
443
444
445
446
447
448
449
450
451
452
453
454
455
456
457
458
459
460
461
462
463
464
465
466
467
468
469
470
471
472
473
474
475
476
477
478
479
480
481
482
483
484
485
486
487
488
489
490
491
492
493
494
495
496
497
498
499
500
501
502
503
{- |
Module : $Header$
Author : Maciek Makowski
Year : 2004
Copyright : (c) Maciek Makowski, Warsaw University 2004
Licence : similar to LGPL, see HetCATS/LICENCE.txt or LIZENZ.txt
Maintainer : hets@tzi.de
Stability : provisional
Portability : non-portable (via imports)
Analysis of architectural specifications.
Follows the extended static semantics sketched in Chap. III:5.6
of the CASL Reference Manual.
TODO:
- pass proper positions instead of nullPos to message functions
- see specific TODOs in functions
-}
module Static.AnalysisArchitecture (ana_ARCH_SPEC, ana_UNIT_SPEC)
where
import Maybe
import Logic.Logic
import Logic.Grothendieck
import Common.Lib.Graph
import Static.DevGraph
import Static.ArchDiagram
-- import Syntax.AS_Library
import Syntax.AS_Architecture
import Syntax.AS_Structured
import Static.AnalysisStructured
import Common.AS_Annotation
import Common.Id (Token)
-- import Common.GlobalAnnotations
-- import Common.ConvertGlobalAnnos
-- import Common.AnalyseAnnos
import Common.Result
import Common.Id
import Common.Lib.Graph
import qualified Common.Lib.Map as Map
import Syntax.Print_AS_Architecture
-- import Common.PrettyPrint
-- import Common.AnnoState
-- import Options
-- import System
-- import List
-- import Directory
-- import ReadFn
-- import WriteFn (writeFileInfo)
-- TODO: the default logic for homogenisation should be obtained from the diagram
--import CASL.Logic_CASL
-- | Analyse an architectural specification
-- @
-- ARCH-SPEC ::= BASIC-ARCH-SPEC | GROUP-ARCH-SPEC | ARCH-SPEC-NAME
-- @
ana_ARCH_SPEC :: LogicGraph -> AnyLogic -- ^ the default logic
-> GlobalContext -> AnyLogic -- ^ current logic
-> Bool -- ^ should only the structure be analysed?
-> ARCH_SPEC -> Result (ArchSig, DGraph, ARCH_SPEC)
-- ^ returns 1. the architectural signature of given ARCH-SPEC 2. development graph resulting from
-- structured specs within the arch spec and 3. ARCH_SPEC after possible conversions
-- BASIC-ARCH-SPEC
ana_ARCH_SPEC lgraph defl gctx@(gannos, genv, _) curl justStruct (Basic_arch_spec udd uexpr pos) =
do (uctx, dg', udd') <- ana_UNIT_DECL_DEFNS lgraph defl gctx curl justStruct udd
(_, usig, _, dg'', uexpr') <- ana_UNIT_EXPRESSION lgraph defl (gannos, genv, dg') curl justStruct uctx (item uexpr)
return ((ctx uctx, usig), dg'', Basic_arch_spec udd' (replaceAnnoted uexpr' uexpr) pos)
-- GROUP-ARCH-SPEC
ana_ARCH_SPEC lgraph defl gctx curl justStruct (Group_arch_spec asp _) =
ana_ARCH_SPEC lgraph defl gctx curl justStruct (item asp)
-- ARCH-SPEC-NAME
ana_ARCH_SPEC _ defl (_, genv, dg) _ _ asp@(Arch_spec_name asn@(Token _ pos)) =
do case Map.lookup asn genv of
Nothing -> plain_error ((emptyStUnitCtx, (emptyUnitSig defl)), dg, asp)
("Undefined architectural specification " ++ showPretty asn "")
pos
Just (ArchEntry asig) -> return (asig, dg, asp)
_ -> plain_error ((emptyStUnitCtx, (emptyUnitSig defl)), dg, asp)
((showPretty asn "") ++ " is not an architectural specification")
pos
-- | Analyse a list of unit declarations and definitions
ana_UNIT_DECL_DEFNS :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> [Annoted UNIT_DECL_DEFN]
-> Result (ExtStUnitCtx, DGraph, [Annoted UNIT_DECL_DEFN])
-- ^ returns 1. extended static unit context 2. possibly modified development graph
-- 3. possibly modified list of unit declarations and definitions
ana_UNIT_DECL_DEFNS lgraph defl gctx curl justStruct udds =
ana_UNIT_DECL_DEFNS' lgraph defl gctx curl justStruct emptyExtStUnitCtx udds
ana_UNIT_DECL_DEFNS' :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic -> Bool
-> ExtStUnitCtx -> [Annoted UNIT_DECL_DEFN]
-> Result (ExtStUnitCtx, DGraph, [Annoted UNIT_DECL_DEFN])
ana_UNIT_DECL_DEFNS' _ _ (_, _, dg) _ _ uctx [] =
do return (uctx, dg, [])
ana_UNIT_DECL_DEFNS' lgraph defl gctx@(gannos, genv, _) curl justStruct uctx (udd : udds) =
do (uctx', dg', udd') <- ana_UNIT_DECL_DEFN lgraph defl gctx curl justStruct uctx (item udd)
(uctx'', dg'', udds') <- ana_UNIT_DECL_DEFNS' lgraph defl (gannos, genv, dg') curl justStruct uctx' udds
return (uctx'', dg'', (replaceAnnoted udd' udd) : udds')
-- | Analyse unit declaration or definition
ana_UNIT_DECL_DEFN :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> UNIT_DECL_DEFN -> Result (ExtStUnitCtx, DGraph, UNIT_DECL_DEFN)
-- ^ returns 1. extended static unit context 2. possibly modified development graph
-- 3. possibly modified UNIT_DECL_DEFN
-- unit declaration
ana_UNIT_DECL_DEFN lgraph defl gctx@(gannos, genv, _) curl justStruct
uctx@(buc, _) (Unit_decl un@(Token _ unpos) usp uts pos) =
do (dns, diag', dg', uts') <- ana_UNIT_IMPORTED lgraph defl gctx curl justStruct uctx uts
let impSig = getSigFromDiag dns
(usig, dg'', usp') <- ana_UNIT_SPEC lgraph defl (gannos, genv, dg') curl justStruct impSig usp
let ud' = Unit_decl un usp' uts' pos
if Map.member un buc
then
plain_error (uctx, dg'', ud')
("Unit " ++ showPretty un " already declared/defined")
unpos
else
case usig of
Par_unit_sig (argSigs, resultSig) ->
do (resultSig', dg''') <- nodeSigUnion lgraph dg'' (resultSig : [impSig]) DGImports
let basedParUSig = Based_par_unit_sig (dns, (argSigs, resultSig'))
return ((Map.insert un basedParUSig buc, diag'), dg''', ud')
Unit_sig nsig ->
do (nsig', dg''') <- nodeSigUnion lgraph dg'' (impSig : [nsig]) DGImports
(dn', diag'') <- extendDiagram lgraph diag' [dns] nsig'
return ((Map.insert un (Based_unit_sig dn') buc, diag''), dg''', ud')
-- unit definition
ana_UNIT_DECL_DEFN lgraph defl gctx curl justStruct uctx@(buc, _)
(Unit_defn un@(Token _ unpos) uexp poss) =
do (p, usig, diag, dg', uexp') <- ana_UNIT_EXPRESSION lgraph defl gctx curl justStruct uctx uexp
let ud' = Unit_defn un uexp' poss
{- it's sufficient to check that un is not mapped in buc, we don't need
to convert the ExtStUnitCtx to StUnitCtx as the domain will be preserved -}
if Map.member un buc
then
plain_error (uctx, dg', ud')
("Unit " ++ showPretty un " already defined/declared")
unpos
else
case usig of
{- we can use Map.insert as there are no mappings for un in ps and bs
(otherwise there would have been a mapping in (ctx uctx)) -}
Unit_sig _ -> return ((Map.insert un (Based_unit_sig p) buc, diag),
dg', ud')
Par_unit_sig parusig -> return ((Map.insert un (Based_par_unit_sig (p, parusig)) buc, diag),
dg', ud')
-- | Analyse unit imports
ana_UNIT_IMPORTED :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> [Annoted UNIT_TERM]
-> Result (DiagNodeSig, Diag, DGraph, [Annoted UNIT_TERM])
ana_UNIT_IMPORTED _ _ (_, _, dg) curl _ (_, diag) [] =
do return (Empty_node curl, diag, dg, [])
ana_UNIT_IMPORTED lgraph defl gctx curl justStruct uctx terms =
do (dnsigs, diag', dg', terms') <- ana_UNIT_IMPORTED' lgraph defl gctx curl justStruct uctx terms
(sig, dg'') <- nodeSigUnion lgraph dg' (map getSigFromDiag dnsigs) DGImports
-- check amalgamability conditions
-- let incl s = propagateErrors (ginclusion lgraph (getSig (getSigFromDiag s)) (getSig sig))
(dnsig@(Diag_node_sig n _), diag'') <- extendDiagram lgraph diag' dnsigs sig
() <- assertAmalgamability nullPos diag' (inn diag'' n)
return (dnsig, diag'', dg'', terms')
ana_UNIT_IMPORTED' :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> [Annoted UNIT_TERM]
-> Result ([DiagNodeSig], Diag, DGraph, [Annoted UNIT_TERM])
ana_UNIT_IMPORTED' _ _ (_, _, dg) _ _ (_, diag) [] =
do return ([], diag, dg, [])
ana_UNIT_IMPORTED' lgraph defl gctx@(gannos, genv, _) curl justStruct uctx@(buc, _) (ut : uts) =
do (dnsig, diag', dg', ut') <- ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (item ut)
(dnsigs, diag'', dg'', uts') <- ana_UNIT_IMPORTED' lgraph defl (gannos, genv, dg') curl justStruct (buc, diag') uts
return (dnsig : dnsigs, diag'', dg'', (replaceAnnoted ut' ut) : uts')
-- | Analyse an unit expression
ana_UNIT_EXPRESSION :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> UNIT_EXPRESSION
-> Result (DiagNodeSig, UnitSig, Diag, DGraph, UNIT_EXPRESSION)
ana_UNIT_EXPRESSION lgraph defl gctx curl justStruct uctx (Unit_expression [] ut poss) =
do (dnsig, diag', dg', ut') <- ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (item ut)
return (dnsig, Unit_sig (getSigFromDiag dnsig), diag', dg',
Unit_expression [] (replaceAnnoted ut' ut) poss)
ana_UNIT_EXPRESSION lgraph defl gctx@(gannos, genv, _) curl justStruct
uctx@(buc, diag) (Unit_expression ubs ut poss) =
do (args, dg', ubs') <- ana_UNIT_BINDINGS lgraph defl gctx curl justStruct uctx ubs
(resnsig, dg'') <- nodeSigUnion lgraph dg' (map snd args) DGFormalParams
-- build the extended diagram and new based unit context
let insNodes diag [] buc = do return ([], diag, buc)
insNodes diag ((un, nsig) : args) buc =
do (dnsig, diag') <- extendDiagram lgraph diag [] nsig
{- we made sure in ana_UNIT_BINDINGS that there's no mapping for un in buc
so we can just use Map.insert -}
let buc' = Map.insert un (Based_unit_sig dnsig) buc
(dnsigs, diag'', buc'') <- insNodes diag' args buc'
return (dnsig : dnsigs, diag'', buc'')
(pardnsigs, diag', buc') <- insNodes diag args buc
(resdnsig, diag'') <- extendDiagram lgraph diag' pardnsigs resnsig
-- analyse the unit term
(p@(Diag_node_sig n _), diag''', dg''', ut') <- ana_UNIT_TERM lgraph defl (gannos, genv, dg'')
curl justStruct (buc', diag'') (item ut)
-- add new node to the diagram
(z, diag4) <- extendDiagram lgraph diag''' [] (EmptyNode curl)
-- check amalgamability conditions
-- TODO: make sure the sink is correct
() <- assertAmalgamability nullPos diag (inn diag''' n)
return (z, Par_unit_sig (map snd args, getSigFromDiag p), diag4, dg''',
Unit_expression ubs' (replaceAnnoted ut' ut) poss)
-- | Analyse a list of unit bindings. Ensures that the unit names are not present
-- in extended static unit context and that there are no duplicates among them.
ana_UNIT_BINDINGS :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> [UNIT_BINDING]
-> Result ([(SIMPLE_ID, NodeSig)], DGraph, [UNIT_BINDING])
ana_UNIT_BINDINGS _ _ (_, _, dg) _ _ _ [] =
do return ([], dg, [])
ana_UNIT_BINDINGS lgraph defl gctx@(gannos, genv, _) curl justStruct uctx@(buc, _)
((Unit_binding un@(Token _ unpos) usp poss) : ubs) =
do (usig, dg', usp') <- ana_UNIT_SPEC lgraph defl gctx curl justStruct (EmptyNode curl) usp
let ub' = Unit_binding un usp' poss
case usig of
Par_unit_sig _ -> plain_error ([], dg', [])
("An argument unit " ++ showPretty un " must not be parameterized")
unpos
Unit_sig nsig ->
do (args, dg'', ubs') <- ana_UNIT_BINDINGS lgraph defl (gannos, genv, dg') curl justStruct uctx ubs
let args' = (un, nsig) : args
if Map.member un buc
then
plain_error (args', dg'', ub' : ubs')
("Unit " ++ showPretty un " already declared/defined")
unpos
else
case lookup un args of
Just _ -> plain_error (args', dg'', ub' : ubs')
("Unit " ++ showPretty un " already declared/defined")
unpos
Nothing -> return (args', dg'', ub' : ubs')
-- | Analyse a list of unit terms
ana_UNIT_TERMS :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> [Annoted UNIT_TERM]
-> Result ([DiagNodeSig], Diag, DGraph, [Annoted UNIT_TERM])
ana_UNIT_TERMS _ _ (_, _, dg) _ _ (_, diag) [] =
do return ([], diag, dg, [])
ana_UNIT_TERMS lgraph defl gctx@(gannos, genv, _) curl justStruct uctx@(buc, _) (ut : uts) =
do (dnsig, diag', dg', ut') <- ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (item ut)
(dnsigs, diag'', dg'', uts') <- ana_UNIT_TERMS lgraph defl (gannos, genv, dg') curl justStruct (buc, diag') uts
return (dnsig : dnsigs, diag'', dg'', (replaceAnnoted ut' ut) : uts')
-- | Analyse an unit term
ana_UNIT_TERM :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> UNIT_TERM
-> Result (DiagNodeSig, Diag, DGraph, UNIT_TERM)
-- UNIT-REDUCTION
ana_UNIT_TERM lgraph defl gctx curl@(Logic lid) justStruct uctx (Unit_reduction ut restr) =
do (p, diag, dg, ut') <- ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (item ut)
-- TODO: what with the second morphism returned by ana_RESTRICTION?
(morph, _) <- ana_RESTRICTION dg (emptyG_sign curl) (getSig (getSigFromDiag p)) justStruct restr
-- TODO: the domain of morph should already be in the dev graph -- find it there
-- temporary solution: create new node representing the domain of morph
let rsig' = dom Grothendieck morph
nodeContents = DGNode {dgn_name = Nothing,
dgn_sign = rsig',
dgn_sens = G_l_sentence_list lid [],
dgn_origin = DGHiding }
[node] = newNodes 0 dg
dg' = insNode (node, nodeContents) dg
sig' <- return (NodeSig (node, rsig'))
(q, diag') <- extendDiagramRev lgraph diag [p] sig'
(q'@(Diag_node_sig n _), diag'', dg'') <- extendDiagramWithMorphism nullPos lgraph diag' dg' q morph
-- check amalgamability conditions
() <- assertAmalgamability nullPos diag'' (inn diag'' n)
return (q', diag'', dg'', Unit_reduction (replaceAnnoted ut' ut) restr)
-- UNIT-TRANSLATION
ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (Unit_translation ut ren) =
do (dnsig, diag, dg, ut') <- ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (item ut)
gMorph <- ana_RENAMING dg (getSig (getSigFromDiag dnsig)) justStruct ren
-- create an edge in the diagram that represents gMorph
-- TODO: pass a meaningful position
(dnsig'@(Diag_node_sig n _), diag', dg') <- extendDiagramWithMorphism nullPos lgraph diag dg dnsig gMorph
-- check amalamability conditions
() <- assertAmalgamability nullPos diag' (inn diag' n)
return (dnsig', diag', dg', Unit_translation (replaceAnnoted ut' ut) ren)
-- AMALGAMATION
ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (Amalgamation uts poss) =
do (dnsigs, diag, dg', uts') <- ana_UNIT_TERMS lgraph defl gctx curl justStruct uctx uts
-- compute sigma
(sig, dg'') <- nodeSigUnion lgraph dg' (map getSigFromDiag dnsigs) DGUnion
(q@(Diag_node_sig n _), diag') <- extendDiagram lgraph diag dnsigs sig
-- check amalgamability conditions
() <- assertAmalgamability (headPos poss) diag' (inn diag' n)
return (q, diag', dg'', Amalgamation uts' poss)
-- LOCAL-UNIT
ana_UNIT_TERM lgraph defl gctx@(gannos, genv, _) curl justStruct uctx (Local_unit udds ut poss) =
do (uctx', dg, udds') <- ana_UNIT_DECL_DEFNS' lgraph defl gctx curl justStruct uctx udds
(dnsig, diag, dg', ut') <- ana_UNIT_TERM lgraph defl (gannos, genv, dg) curl justStruct uctx' (item ut)
return (dnsig, diag, dg', Local_unit udds' (replaceAnnoted ut' ut) poss)
-- UNIT-APPL
ana_UNIT_TERM lgraph defl (gannos, genv, dg) curl justStruct uctx@(buc, diag)
uappl@(Unit_appl un@(Token _ unpos) fargus poss) =
do case Map.lookup un buc of
Just (Based_unit_sig dnsig) ->
do case fargus of
[] -> return (dnsig, diag, dg, uappl)
_ -> -- arguments have been given for a parameterless unit
do plain_error (dnsig, diag, dg, uappl)
(showPretty un " is a parameterless unit, but arguments have been given: " ++
showPretty fargus "")
unpos
Just (Based_par_unit_sig (pI, (argSigs, resultSig))) ->
do (sigF, dg') <- nodeSigUnion lgraph dg ((getSigFromDiag pI) : argSigs) DGFormalParams
(morphSigs, dg'', diagA) <- ana_FIT_ARG_UNITS lgraph defl (gannos, genv, dg') curl justStruct uctx
uappl unpos argSigs fargus
let first (e, _, _) = e
second (_, e, _) = e
third (_, _, e) = e
(sigA, dg''') <- nodeSigUnion lgraph dg''
((getSigFromDiag pI) : (map second morphSigs))
DGFitSpec
-- compute morphA (\sigma^A)
G_sign lidI sigI <- return (getSig (getSigFromDiag pI))
let idI = G_morphism lidI (ide lidI sigI)
morphA <- homogeneousMorManyUnion (headPos poss) (idI : (map first morphSigs))
-- compute sigMorExt (\sigma^A(\Delta))
(sigR, sigMorExt) <- extendMorphism (headPos poss) (getSig sigF) (getSig resultSig) (getSig sigA) morphA
(qB, diag') <- extendDiagram lgraph diagA [pI] resultSig
-- insert nodes p^F_i and appropriate edges to the diagram
let ins diag dg [] = do return (diag, dg)
ins diag dg ((morph, _, targetNode) : morphNodes) =
do (dnsig, diag', dg') <- extendDiagramWithMorphismRev unpos lgraph diag
dg targetNode (gEmbed morph)
diag'' <- insInclusionEdges lgraph diag' [dnsig] qB
ins diag'' dg' morphNodes
(diag'', dg4) <- ins diag' dg''' morphSigs
(q@(Diag_node_sig n _), diag''', dg5) <- extendDiagramWithMorphism unpos lgraph diag'' dg4 qB (gEmbed sigMorExt)
diag4 <- insInclusionEdges lgraph diag''' (map third morphSigs) q
-- check amalgamability conditions
() <- assertAmalgamability unpos diag4 (inn diag4 n)
return (q, diag4, dg5, uappl)
Nothing -> plain_error (emptyDiagNodeSig defl, diag, dg, uappl)
("Undefined unit " ++ showPretty un "")
unpos
-- group unit term
ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (Group_unit_term ut poss) =
do (dnsig, diag, dg, ut') <- ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (item ut)
return (dnsig, diag, dg, Group_unit_term (replaceAnnoted ut' ut) poss)
-- | Analyse unit arguments
ana_FIT_ARG_UNITS :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx
-> UNIT_TERM -- ^ the whole application for diagnostic purposes
-> Pos -- ^ the position of the application (for diagnostic purposes)
-> [NodeSig] -- ^ the signatures of unit's formal parameters
-> [FIT_ARG_UNIT] -- ^ the arguments for the unit
-> Result ([(G_morphism, NodeSig, DiagNodeSig)], DGraph, Diag)
ana_FIT_ARG_UNITS _ _ (_, _, dg) _ _ (_, diag) _ _ [] [] =
do return ([], dg, diag)
ana_FIT_ARG_UNITS lgraph defl gctx@(gannos, genv, _) curl justStruct uctx@(buc, _)
appl pos (nsig : nsigs) (fau : faus) =
do (gmorph, nsig', dnsig, dg, diag) <- ana_FIT_ARG_UNIT lgraph defl gctx curl justStruct
uctx nsig fau
(morphSigs, dg', diag') <- ana_FIT_ARG_UNITS lgraph defl (gannos, genv, dg) curl justStruct
(buc, diag) appl pos nsigs faus
return ((gmorph, nsig', dnsig) : morphSigs, dg', diag')
ana_FIT_ARG_UNITS _ _ (_, _, dg) _ _ (_, diag) appl pos [] _ =
do plain_error ([], dg, diag)
("Too many arguments given in application\n" ++ showPretty appl "")
pos
ana_FIT_ARG_UNITS _ _ (_, _, dg) _ _ (_, diag) appl pos _ [] =
do plain_error ([], dg, diag)
("Too few arguments given in application\n" ++ showPretty appl "")
pos
-- | Analyse unit argument
ana_FIT_ARG_UNIT :: LogicGraph -> AnyLogic -> GlobalContext -> AnyLogic
-> Bool -> ExtStUnitCtx -> NodeSig -> FIT_ARG_UNIT
-> Result (G_morphism, NodeSig, DiagNodeSig, DGraph, Diag)
-- ^ returns 1. the signature morphism 2. the target signature of the morphism
-- 3. the diagram node 4. the modified DGraph 5. the modified diagram
ana_FIT_ARG_UNIT lgraph defl gctx curl justStruct uctx nsig (Fit_arg_unit ut symbMap poss) =
do (p, diag', dg', _) <- ana_UNIT_TERM lgraph defl gctx curl justStruct uctx (item ut)
-- compute gMorph (the morphism r|sigma/D(p))
let adj = adjustPos (headPos poss)
gsigmaS = getSig nsig
gsigmaT = getSig (getSigFromDiag p)
G_sign lidS sigmaS <- return gsigmaS
G_sign lidT sigmaT <- return gsigmaT
G_symb_map_items_list lid sis <- return symbMap
sigmaT' <- rcoerce lidT lidS (headPos poss) sigmaT
mor <- if justStruct then return (ide lidS sigmaS)
else do rmap <- adj $ stat_symb_map_items lid sis
rmap' <- rcoerce lid lidS (headPos poss) rmap
adj $ induced_from_to_morphism lidS rmap' sigmaS sigmaT'
let gMorph = G_morphism lidS mor
(nsig', dg'') <- extendDGraph dg' nsig (gEmbed gMorph) DGFitSpec
return (gMorph, nsig', p, dg'', diag')
-- | Analyse unit specification
ana_UNIT_SPEC :: LogicGraph -> AnyLogic -- ^ the default logic
-> GlobalContext -> AnyLogic -- ^ current logic
-> Bool -- ^ should only the structure be analysed?
-> NodeSig -- ^ the signature of imports
-> UNIT_SPEC -> Result (UnitSig, DGraph, UNIT_SPEC)
-- ^ returns 1. unit signature 2. the development graph resulting from
-- structred specs inside the unit spec and 3. a UNIT_SPEC after possible
-- conversions.
-- UNIT-TYPE
{- if argspecs are empty and resultspec is a name of unit spec then this
should be converted to a Spec_name -}
ana_UNIT_SPEC lgraph defl gctx@(_, genv, _) curl just_struct
impsig (Unit_type [] (Annoted (Spec_inst spn [] _) _ _ _) _)
| case Map.lookup spn genv of Just (UnitEntry _) -> True
_ -> False =
ana_UNIT_SPEC lgraph defl gctx curl just_struct impsig (Spec_name spn)
-- a trivial unit type
ana_UNIT_SPEC lgraph _ gctx _ just_struct impsig (Unit_type [] resultSpec poss) =
do (resultSpec', resultSig, dg') <- ana_SPEC lgraph gctx impsig Nothing
just_struct (item resultSpec)
return (Unit_sig resultSig, dg', Unit_type [] (replaceAnnoted resultSpec' resultSpec) poss)
-- a non-trivial unit type
ana_UNIT_SPEC lgraph defl gctx@(gannos, genv, _) _ justStruct impSig (Unit_type argSpecs resultSpec poss) =
do (argSigs, dg1, argSpecs') <- ana_argSpecs lgraph defl gctx justStruct argSpecs
(sigUnion, dg2) <- nodeSigUnion lgraph dg1 (impSig : argSigs) DGFormalParams
(resultSpec', resultSig, dg3) <- ana_SPEC lgraph (gannos, genv, dg2) sigUnion
Nothing justStruct (item resultSpec)
return (Par_unit_sig (argSigs, resultSig), dg3,
Unit_type argSpecs' (replaceAnnoted resultSpec' resultSpec) poss)
-- SPEC-NAME (an alias)
ana_UNIT_SPEC _ _ (_, genv, dg) _ _ impsig usp@(Spec_name usn@(Token _ pos)) =
do case Map.lookup usn genv of
Nothing -> plain_error (Unit_sig impsig, dg, usp)
("Undefined unit specification " ++ showPretty usn "")
pos
Just (UnitEntry usig) -> return (usig, dg, usp)
_ -> plain_error (Unit_sig impsig, dg, usp)
((showPretty usn "") ++ " is not an unit specification")
pos
-- ARCH-UNIT-SPEC
ana_UNIT_SPEC lgraph defl gctx curl just_struct _ (Arch_unit_spec asp poss) =
do ((_, usig), dg', asp') <- ana_ARCH_SPEC lgraph defl gctx curl just_struct (item asp)
return (usig, dg', Arch_unit_spec (replaceAnnoted asp' asp) poss)
-- CLOSED-UNIT-SPEC
ana_UNIT_SPEC lgraph defl gctx curl just_struct _ (Closed_unit_spec usp' _) =
ana_UNIT_SPEC lgraph defl gctx curl just_struct (EmptyNode curl) usp'
-- | Analyse a list of argument specifications
ana_argSpecs :: LogicGraph -> AnyLogic -> GlobalContext -> Bool -> [Annoted SPEC]
-> Result ([NodeSig], DGraph, [Annoted SPEC])
ana_argSpecs _ _ (_, _, dg) _ [] =
do return ([], dg, [])
ana_argSpecs lgraph defl gctx@(gannos, genv, _) justStruct (argSpec : argSpecs) =
do (argSpec', argSig, dg') <- ana_SPEC lgraph gctx (EmptyNode defl) Nothing
justStruct (item argSpec)
(argSigs, dg'', argSpecs') <- ana_argSpecs lgraph defl (gannos, genv, dg') justStruct argSpecs
return (argSig : argSigs, dg'', (replaceAnnoted argSpec' argSpec) : argSpecs')
-- | Check that given diagram ensures amalgamability along given set of morphisms
assertAmalgamability :: Pos -- ^ the position (for diagnostics)
-> Diag -- ^ the diagram to be checked
-> [LEdge DiagLinkLab] -- ^ the sink
-> Result ()
assertAmalgamability pos diag sink =
do ensAmalg <- homogeneousEnsuresAmalgamability diag sink
case ensAmalg of
Yes -> return ()
No msg -> plain_error () ("Amalgamability is not ensured: " ++ msg) pos
DontKnow -> warning () "Unable to assert that amalgamability is ensured" pos
-- | Check the amalgamability assuming common logic for whole diagram
homogeneousEnsuresAmalgamability :: Diag -- ^ the diagram to be checked
-> [LEdge DiagLinkLab] -- ^ the sink
-> Result Amalgamates
homogeneousEnsuresAmalgamability diag sink =
do let (_,_,edgeLab) = case sink of
[] -> error "homogeneousEnsuresAmalgamability: Empty sink"
lab:_ -> lab
sig = cod Grothendieck (dl_morphism edgeLab)
G_sign lid _ <- return sig
hDiag <- homogeniseDiagram lid diag
hSink <- homogeniseEdges lid sink
ensures_amalgamability lid (hDiag, hSink)