blob: a184270f497e081bc3b6c02164ab7992452804f8 [file] [log] [blame]
Harald Welteb61d0bc2011-03-25 23:56:56 +01001-- $Id: MAP-SS-DataTypes.asn 34814 2010-11-08 23:15:16Z etxrab $
2-- 3GPP TS 29.002 V9.3.0 (2010-09)
3-- 17.7.4 Supplementary service data types
4
Harald Welte7a23af32011-02-07 21:24:26 +01005MAP-SS-DataTypes {
6 itu-t identified-organization (4) etsi (0) mobileDomain (0)
Harald Welteb61d0bc2011-03-25 23:56:56 +01007 gsm-Network (1) modules (3) map-SS-DataTypes (14) version12 (12)}
Harald Welte7a23af32011-02-07 21:24:26 +01008
9DEFINITIONS
10
11IMPLICIT TAGS
12
13::=
14
15BEGIN
16
17EXPORTS
18 RegisterSS-Arg,
19 SS-Info,
20 SS-Status,
21 SS-SubscriptionOption,
22 SS-ForBS-Code,
23 InterrogateSS-Res,
24 USSD-Arg,
25 USSD-Res,
26 USSD-DataCodingScheme,
27 USSD-String,
28 Password,
29 GuidanceInfo,
30 SS-List,
31 SS-InfoList,
32 OverrideCategory,
33 CliRestrictionOption,
34 NoReplyConditionTime,
35 ForwardingOptions,
36 maxNumOfSS,
37 SS-Data,
38 SS-InvocationNotificationArg,
39 SS-InvocationNotificationRes,
40 CCBS-Feature,
41 RegisterCC-EntryArg,
42 RegisterCC-EntryRes,
43 EraseCC-EntryArg,
44 EraseCC-EntryRes
45;
46
47IMPORTS
48 AddressString,
49 ISDN-AddressString,
50 ISDN-SubaddressString,
51 FTN-AddressString,
52 IMSI,
53 BasicServiceCode,
54 AlertingPattern,
55 EMLPP-Priority,
56 MaxMC-Bearers,
57 MC-Bearers,
58 ExternalSignalInfo
59FROM MAP-CommonDataTypes {
60 itu-t identified-organization (4) etsi (0) mobileDomain (0)
Harald Welteb61d0bc2011-03-25 23:56:56 +010061 gsm-Network (1) modules (3) map-CommonDataTypes (18) version12 (12)}
Harald Welte7a23af32011-02-07 21:24:26 +010062
63 ExtensionContainer
64FROM MAP-ExtensionDataTypes {
65 itu-t identified-organization (4) etsi (0) mobileDomain (0)
Harald Welteb61d0bc2011-03-25 23:56:56 +010066 gsm-Network (1) modules (3) map-ExtensionDataTypes (21) version12 (12)}
Harald Welte7a23af32011-02-07 21:24:26 +010067
68 SS-Code
69FROM MAP-SS-Code {
70 itu-t identified-organization (4) etsi (0) mobileDomain (0)
Harald Welteb61d0bc2011-03-25 23:56:56 +010071 gsm-Network (1) modules (3) map-SS-Code (15) version12 (12)}
Harald Welte7a23af32011-02-07 21:24:26 +010072;
73
74
75RegisterSS-Arg ::= SEQUENCE {
76 ss-Code SS-Code,
77 basicService BasicServiceCode OPTIONAL,
78 forwardedToNumber [4] AddressString OPTIONAL,
79 forwardedToSubaddress [6] ISDN-SubaddressString OPTIONAL,
80 noReplyConditionTime [5] NoReplyConditionTime OPTIONAL,
81 ...,
82 defaultPriority [7] EMLPP-Priority OPTIONAL,
83 nbrUser [8] MC-Bearers OPTIONAL,
84 longFTN-Supported [9] NULL OPTIONAL }
85
86NoReplyConditionTime ::= INTEGER (5..30)
87
88SS-Info ::= CHOICE {
89 forwardingInfo [0] ForwardingInfo,
90 callBarringInfo [1] CallBarringInfo,
91 ss-Data [3] SS-Data}
92
93ForwardingInfo ::= SEQUENCE {
94 ss-Code SS-Code OPTIONAL,
95 forwardingFeatureList ForwardingFeatureList,
96 ...}
97
98ForwardingFeatureList ::=
99 SEQUENCE SIZE (1..maxNumOfBasicServiceGroups) OF
100 ForwardingFeature
101
102ForwardingFeature ::= SEQUENCE {
103 basicService BasicServiceCode OPTIONAL,
104 ss-Status [4] SS-Status OPTIONAL,
105 forwardedToNumber [5] ISDN-AddressString OPTIONAL,
106 forwardedToSubaddress [8] ISDN-SubaddressString OPTIONAL,
107 forwardingOptions [6] ForwardingOptions OPTIONAL,
108 noReplyConditionTime [7] NoReplyConditionTime OPTIONAL,
109 ...,
110 longForwardedToNumber [9] FTN-AddressString OPTIONAL }
111
112SS-Status ::= OCTET STRING (SIZE (1))
113
114 -- bits 8765: 0000 (unused)
115 -- bits 4321: Used to convey the "P bit","R bit","A bit" and "Q bit",
116 -- representing supplementary service state information
117 -- as defined in TS 3GPP TS 23.011 [22]
118
119 -- bit 4: "Q bit"
120
121 -- bit 3: "P bit"
122
123 -- bit 2: "R bit"
124
125 -- bit 1: "A bit"
126
127ForwardingOptions ::= OCTET STRING (SIZE (1))
128
129 -- bit 8: notification to forwarding party
130 -- 0 no notification
131 -- 1 notification
132
133 -- bit 7: redirecting presentation
134 -- 0 no presentation
135 -- 1 presentation
136
137 -- bit 6: notification to calling party
138 -- 0 no notification
139 -- 1 notification
140
141 -- bit 5: 0 (unused)
142
143 -- bits 43: forwarding reason
144 -- 00 ms not reachable
145 -- 01 ms busy
146 -- 10 no reply
147 -- 11 unconditional when used in a SRI Result,
148 -- or call deflection when used in a RCH Argument
149 -- bits 21: 00 (unused)
150
151CallBarringInfo ::= SEQUENCE {
152 ss-Code SS-Code OPTIONAL,
153 callBarringFeatureList CallBarringFeatureList,
154 ...}
155
156CallBarringFeatureList ::= SEQUENCE SIZE (1..maxNumOfBasicServiceGroups) OF
157 CallBarringFeature
158
159CallBarringFeature ::= SEQUENCE {
160 basicService BasicServiceCode OPTIONAL,
161 ss-Status [4] SS-Status OPTIONAL,
162 ...}
163
164SS-Data ::= SEQUENCE {
165 ss-Code SS-Code OPTIONAL,
166 ss-Status [4] SS-Status OPTIONAL,
167 ss-SubscriptionOption SS-SubscriptionOption OPTIONAL,
168 basicServiceGroupList BasicServiceGroupList OPTIONAL,
169 ...,
170 defaultPriority EMLPP-Priority OPTIONAL,
171 nbrUser [5] MC-Bearers OPTIONAL
172 }
173
174SS-SubscriptionOption ::= CHOICE {
175 cliRestrictionOption [2] CliRestrictionOption,
176 overrideCategory [1] OverrideCategory}
177
178CliRestrictionOption ::= ENUMERATED {
179 permanent (0),
180 temporaryDefaultRestricted (1),
181 temporaryDefaultAllowed (2)}
182
183OverrideCategory ::= ENUMERATED {
184 overrideEnabled (0),
185 overrideDisabled (1)}
186
187SS-ForBS-Code ::= SEQUENCE {
188 ss-Code SS-Code,
189 basicService BasicServiceCode OPTIONAL,
190 ...,
191 longFTN-Supported [4] NULL OPTIONAL }
192
193GenericServiceInfo ::= SEQUENCE {
194 ss-Status SS-Status,
195 cliRestrictionOption CliRestrictionOption OPTIONAL,
196 ...,
197 maximumEntitledPriority [0] EMLPP-Priority OPTIONAL,
198 defaultPriority [1] EMLPP-Priority OPTIONAL,
199 ccbs-FeatureList [2] CCBS-FeatureList OPTIONAL,
200 nbrSB [3] MaxMC-Bearers OPTIONAL,
201 nbrUser [4] MC-Bearers OPTIONAL,
202 nbrSN [5] MC-Bearers OPTIONAL }
203
204CCBS-FeatureList ::= SEQUENCE SIZE (1..maxNumOfCCBS-Requests) OF
205 CCBS-Feature
206
207maxNumOfCCBS-Requests INTEGER ::= 5
208
209CCBS-Feature ::= SEQUENCE {
210 ccbs-Index [0] CCBS-Index OPTIONAL,
211 b-subscriberNumber [1] ISDN-AddressString OPTIONAL,
212 b-subscriberSubaddress [2] ISDN-SubaddressString OPTIONAL,
213 basicServiceGroup [3] BasicServiceCode OPTIONAL,
214 ...}
215
216CCBS-Index ::= INTEGER (1..maxNumOfCCBS-Requests)
217
218InterrogateSS-Res ::= CHOICE {
219 ss-Status [0] SS-Status,
220 basicServiceGroupList [2] BasicServiceGroupList,
221 forwardingFeatureList [3] ForwardingFeatureList,
222 genericServiceInfo [4] GenericServiceInfo }
223
224USSD-Arg ::= SEQUENCE {
225 ussd-DataCodingScheme USSD-DataCodingScheme,
226 ussd-String USSD-String,
227 ... ,
228 alertingPattern AlertingPattern OPTIONAL,
229 msisdn [0] ISDN-AddressString OPTIONAL }
230
231USSD-Res ::= SEQUENCE {
232 ussd-DataCodingScheme USSD-DataCodingScheme,
233 ussd-String USSD-String,
234 ...}
235
236USSD-DataCodingScheme ::= OCTET STRING (SIZE (1))
237 -- The structure of the USSD-DataCodingScheme is defined by
238 -- the Cell Broadcast Data Coding Scheme as described in
239 -- TS 3GPP TS 23.038 [25]
240
241USSD-String ::= OCTET STRING (SIZE (1..maxUSSD-StringLength))
242 -- The structure of the contents of the USSD-String is dependent
243 -- on the USSD-DataCodingScheme as described in TS 3GPP TS 23.038 [25].
244
245maxUSSD-StringLength INTEGER ::= 160
246
247Password ::= NumericString
248 (FROM ("0"|"1"|"2"|"3"|"4"|"5"|"6"|"7"|"8"|"9"))
249 (SIZE (4))
250
251GuidanceInfo ::= ENUMERATED {
252 enterPW (0),
253 enterNewPW (1),
254 enterNewPW-Again (2)}
255 -- How this information is really delivered to the subscriber
256 -- (display, announcement, ...) is not part of this
257 -- specification.
258
259SS-List ::= SEQUENCE SIZE (1..maxNumOfSS) OF
260 SS-Code
261
262maxNumOfSS INTEGER ::= 30
263
264SS-InfoList ::= SEQUENCE SIZE (1..maxNumOfSS) OF
265 SS-Info
266
267BasicServiceGroupList ::= SEQUENCE SIZE (1..maxNumOfBasicServiceGroups) OF
268 BasicServiceCode
269
270maxNumOfBasicServiceGroups INTEGER ::= 13
271
272SS-InvocationNotificationArg ::= SEQUENCE {
273 imsi [0] IMSI,
274 msisdn [1] ISDN-AddressString,
275 ss-Event [2] SS-Code,
276 -- The following SS-Code values are allowed :
277 -- ect SS-Code ::= '00110001'B
278 -- multiPTY SS-Code ::= '01010001'B
279 -- cd SS-Code ::= '00100100'B
280 -- ccbs SS-Code ::= '01000100'B
281 ss-EventSpecification [3] SS-EventSpecification OPTIONAL,
282 extensionContainer [4] ExtensionContainer OPTIONAL,
283 ...,
284 b-subscriberNumber [5] ISDN-AddressString OPTIONAL,
285 ccbs-RequestState [6] CCBS-RequestState OPTIONAL
286 }
287
288CCBS-RequestState ::= ENUMERATED {
289 request (0),
290 recall (1),
291 active (2),
292 completed (3),
293 suspended (4),
294 frozen (5),
295 deleted (6)
296 }
297
298SS-InvocationNotificationRes ::= SEQUENCE {
299 extensionContainer ExtensionContainer OPTIONAL,
300 ...
301 }
302
303SS-EventSpecification ::= SEQUENCE SIZE (1..maxEventSpecification) OF
304 AddressString
305
306maxEventSpecification INTEGER ::= 2
307
308RegisterCC-EntryArg ::= SEQUENCE {
309 ss-Code [0] SS-Code,
310 ccbs-Data [1] CCBS-Data OPTIONAL,
311 ...}
312
313CCBS-Data ::= SEQUENCE {
314 ccbs-Feature [0] CCBS-Feature,
315 translatedB-Number [1] ISDN-AddressString,
316 serviceIndicator [2] ServiceIndicator OPTIONAL,
317 callInfo [3] ExternalSignalInfo,
318 networkSignalInfo [4] ExternalSignalInfo,
319 ...}
320
321ServiceIndicator ::= BIT STRING {
322 clir-invoked (0),
323 camel-invoked (1)} (SIZE(2..32))
324 -- exception handling:
325 -- bits 2 to 31 shall be ignored if received and not understood
326
327RegisterCC-EntryRes ::= SEQUENCE {
328 ccbs-Feature [0] CCBS-Feature OPTIONAL,
329 ...}
330
331EraseCC-EntryArg ::= SEQUENCE {
332 ss-Code [0] SS-Code,
333 ccbs-Index [1] CCBS-Index OPTIONAL,
334 ...}
335
336EraseCC-EntryRes ::= SEQUENCE {
337 ss-Code [0] SS-Code,
338 ss-Status [1] SS-Status OPTIONAL,
339 ...}
340
341END