Cross Reference: /hets/Syntax/Print_AS_Structured.hs
Print_AS_Structured.hs revision e6d40133bc9f858308654afb1262b8b483ec5922
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
{- |
Module : $Header$
Description : pretty printing of CASL structured specifications
Copyright : (c) Klaus L�ttich, Uni Bremen 2002-2006
License : similar to LGPL, see HetCATS/LICENSE.txt or LIZENZ.txt
Maintainer : luettich@tzi.de
Stability : provisional
Portability : non-portable(Grothendieck)
Pretty printing of CASL structured specifications
-}
module Syntax.Print_AS_Structured where
import Common.Id
import Common.Keywords
import Common.Doc
import Common.DocUtils
import Common.AS_Annotation
import Logic.Grothendieck()
import Syntax.AS_Structured
structSimpleId :: SIMPLE_ID -> Doc
structSimpleId = structId . tokStr
instance Pretty SPEC where
pretty = printSPEC
printUnion :: [Annoted SPEC] -> [Doc]
printUnion = prepPunctuate (topKey andS <> space) . map condBracesAnd
moveAnnos :: Annoted SPEC -> [Annoted SPEC] -> [Annoted SPEC]
moveAnnos x l = appAnno $ case l of
[] -> error "moveAnnos"
h : r -> h { l_annos = l_annos x ++ l_annos h } : r
where appAnno a = case a of
[] -> []
[h] -> [appendAnno h (r_annos x)]
h : r -> h : appAnno r
printOptUnion :: Annoted SPEC -> [Doc]
printOptUnion x = case skipVoidGroup $ item x of
Union e@(_ : _) _ -> printUnion $ moveAnnos x e
Extension e@(_ : _) _ -> printExtension $ moveAnnos x e
_ -> [pretty x]
printExtension :: [Annoted SPEC] -> [Doc]
printExtension l = case l of
[] -> []
x : r -> printOptUnion x ++
concatMap (( \ (d : s) -> (topKey thenS <+> d) : s) .
printOptUnion) r
printSPEC :: SPEC -> Doc
printSPEC spec = case spec of
Basic_spec aa -> pretty aa
Translation aa ab -> sep [condBracesTransReduct aa, printRENAMING ab]
Reduction aa ab -> sep [condBracesTransReduct aa, printRESTRICTION ab]
Union aa _ ->
sep $ printUnion aa
Extension aa _ ->
sep $ printExtension aa
Free_spec aa _ -> sep [keyword freeS, printGroupSpec aa]
Cofree_spec aa _ -> sep [keyword cofreeS, printGroupSpec aa]
Local_spec aa ab _ ->
fsep [keyword localS, pretty aa,
keyword withinS, condBracesWithin ab]
Closed_spec aa _ -> sep [keyword closedS, printGroupSpec aa]
Group aa _ -> pretty aa
Spec_inst aa ab _ ->
cat [structSimpleId aa, print_fit_arg_list ab]
Qualified_spec ln asp _ ->
printLogicEncoding ln <> colon $+$ (pretty asp)
Data _ _ s1 s2 _ -> keyword dataS <+> pretty s1 $+$ pretty s2
instance Pretty RENAMING where
pretty = printRENAMING
printRENAMING :: RENAMING -> Doc
printRENAMING (Renaming aa _) =
keyword withS <+> ppWithCommas aa
instance Pretty RESTRICTION where
pretty = printRESTRICTION
printRESTRICTION :: RESTRICTION -> Doc
printRESTRICTION rest = case rest of
Hidden aa _ -> keyword hideS <+> ppWithCommas aa
Revealed aa _ -> keyword revealS <+> pretty aa
printLogicEncoding :: (Pretty a) => a -> Doc
printLogicEncoding enc = keyword logicS <+> pretty enc
instance Pretty G_mapping where
pretty = printG_mapping
printG_mapping :: G_mapping -> Doc
printG_mapping gma = case gma of
G_symb_map gsmil -> pretty gsmil
G_logic_translation enc -> printLogicEncoding enc
instance Pretty G_hiding where
pretty = printG_hiding
printG_hiding :: G_hiding -> Doc
printG_hiding ghid = case ghid of
G_symb_list gsil -> pretty gsil
G_logic_projection enc -> printLogicEncoding enc
instance Pretty GENERICITY where
pretty = printGENERICITY
printGENERICITY :: GENERICITY -> Doc
printGENERICITY (Genericity aa ab _) = sep [printPARAMS aa, printIMPORTED ab]
instance Pretty PARAMS where
pretty = printPARAMS
printPARAMS :: PARAMS -> Doc
printPARAMS (Params aa) = cat $ map (brackets . rmTopKey . pretty ) aa
instance Pretty IMPORTED where
pretty = printIMPORTED
printIMPORTED :: IMPORTED -> Doc
printIMPORTED (Imported aa) = case aa of
[] -> empty
_ -> sep [ keyword givenS
, sepByCommas $ map printGroupSpec aa]
instance Pretty FIT_ARG where
pretty = printFIT_ARG
printFIT_ARG :: FIT_ARG -> Doc
printFIT_ARG fit = case fit of
Fit_spec aa ab _ ->
let aa' = rmTopKey $ pretty aa
in if null ab then aa' else
fsep $ aa' : keyword fitS
: punctuate comma (map printG_mapping ab)
Fit_view si ab _ ->
sep [keyword viewS, cat [structSimpleId si, print_fit_arg_list ab]]
instance Pretty Logic_code where
pretty = printLogic_code
printLogic_code :: Logic_code -> Doc
printLogic_code (Logic_code menc msrc mtar _) =
let pm = maybe [] ((: []) . printLogic_name) in
fsep $ maybe [] ((: [colon]) . pretty) menc
++ pm msrc ++ funArrow : pm mtar
instance Pretty Logic_name where
pretty = printLogic_name
printLogic_name :: Logic_name -> Doc
printLogic_name (Logic_name mlog slog) = let d = pretty mlog in
case slog of
Nothing -> d
Just sub -> d <> dot <> pretty sub
-----------------------------------------------
{- |
specealized printing of 'FIT_ARG's
-}
print_fit_arg_list :: [Annoted FIT_ARG] -> Doc
print_fit_arg_list = cat . map (brackets . pretty)
{- |
conditional generation of grouping braces for Union and Extension
-}
printGroupSpec :: Annoted SPEC -> Doc
printGroupSpec s = let d = pretty s in
case skip_Group $ item s of
Spec_inst _ _ _ -> d
_ -> specBraces d
{- |
generate grouping braces for Tanslations and Reductions
-}
condBracesTransReduct :: Annoted SPEC -> Doc
condBracesTransReduct s = let d = pretty s in
case skip_Group $ item s of
Extension _ _ -> specBraces d
Union _ _ -> specBraces d
Local_spec _ _ _ -> specBraces d
_ -> d
{- |
generate grouping braces for Within
-}
condBracesWithin :: Annoted SPEC -> Doc
condBracesWithin s = let d = pretty s in
case skip_Group $ item s of
Extension _ _ -> specBraces d
Union _ _ -> specBraces d
_ -> d
{- |
only Extensions inside of Unions (and) need grouping braces
-}
condBracesAnd :: Annoted SPEC -> Doc
condBracesAnd s = let d = pretty s in
case skip_Group $ item s of
Extension _ _ -> specBraces d
_ -> d
-- | only skip groups without annotations
skipVoidGroup :: SPEC -> SPEC
skipVoidGroup sp =
case sp of
Group g _ | null (l_annos g) && null (r_annos g)
-> skipVoidGroup $ item g
_ -> sp
-- | skip nested groups
skip_Group :: SPEC -> SPEC
skip_Group sp =
case sp of
Group g _ -> skip_Group $ item g
_ -> sp