Test Foro de elhacker.net SMF 2.1

Programación => .NET (C#, VB.NET, ASP) => Programación General => Programación Visual Basic => Mensaje iniciado por: Sanlegas en 15 Septiembre 2011, 04:16 AM

Título: [Reto] IsHour
Publicado por: Sanlegas en 15 Septiembre 2011, 04:16 AM
Bueno para seguir practicando y calentando, ahora por que no un reto para saber si una expresión es una hora  :laugh:, creo que es mas facil pero bueno  :P
la fecha limite es el 18/09/2011 y como no hay una funcion de vb que haga lo mismo (corregirme si me equivoco) se hara en lo mas logico, que acepte el siguiente formato  HH:MM:SS  (horas,minutos,segundos) y las siguientes reglas

* Debe aceptar de "00:00:00" hasta "23:59:59"
* En base a lo anterior y para hacerlo mas interesante lo correcto es llenar los dos lugares, si es menor que 10 se pondra un cero, ejemplo:
"05:59:59" ----> Correcto
"5:59:59" ---- > Falso
* Debe devolver True si la hora es correcta
* El delimitador para separar los numeros es ":"


Buena suerte a todos.. un saludo !  :D
Título: Re: [Reto] IsHour
Publicado por: x64core en 15 Septiembre 2011, 05:23 AM
creo tener la mia :xD

Código (VB) [Seleccionar]

Function R100(XXX As String) As Boolean
Dim X() As String

X = Split(XXX, ":")
If (CInt(X(0)) < 24) And (CInt(X(1) < 60)) And (CInt(X(2) < 60)) Then R100 = True
End Function

Título: Re: [Reto] IsHour
Publicado por: Sanlegas en 15 Septiembre 2011, 05:30 AM
@Raul100:

R100("aa:aa:aa") --- > Fail

para hacerlo mas interesante acabo de agregar una nueva regla  :P
Título: Re: [Reto] IsHour
Publicado por: BlackZeroX en 15 Septiembre 2011, 07:03 AM
Es cuestion solo de modificar algunas cosillas de la funcion isDate. Por ejemplo aqui tienen la mia Donde solo Modifique la 2da funcion isDate de mi tutela. solo Modifique los rangos... y cambio el select case por un simple if then para verificar rangos...

Código (Vb) [Seleccionar]


Option Explicit

Private Declare Sub RtlMoveMemory Lib "kernel32" (ByVal pDst As Long, ByVal pSrc As Long, ByVal ByteLen As Long)

'   //  Formato aceptado   HH:MM:SS, H:/MM:S, HH:MM:S, etc!¡.
Public Function isHour_BlackZX(ByRef sStr As String, Optional bExtrictic As Boolean = True) As Boolean
Dim lChar           As Long
Dim lVal            As Long
Dim lConvert(2)     As Long

Dim lDim            As Long
Dim lMult           As Long
Dim pStr            As Long
Dim pChar           As Long

    pStr = LenB(sStr)
    If (bExtrictic) Then
        If Not (pStr = &H10) Then Exit Function
    ElseIf (pStr < &H5) And (pStr <= &H8) Then
        Exit Function
    End If
   
    pStr = StrPtr(sStr) + (pStr - &H2)
    pChar = VarPtr(lChar)
   
    lDim = &H2
    lMult = &H1
    lConvert(lDim) = &H0
   
    Do Until StrPtr(sStr) > pStr
        RtlMoveMemory pChar, pStr, &H2  '   //  Dos bytes = char...
        lVal = (lChar And &HFF)
        If (lVal = &H3A) Then
            lDim = (lDim - &H1)
            If ((lDim And &H80000000) = &H80000000) Then Exit Function
            lMult = &H1
        Else
            If ((lVal > &H39) Or (lVal < &H30)) Then Exit Function
            lConvert(lDim) = lConvert(lDim) + ((lVal - &H30) * lMult)
            lMult = (lMult * &HA)
        End If
        pStr = (pStr - &H2)
    Loop
       
    If (lConvert(&H0) > &H17) Or (lConvert(&H1) > &H3B) Or (lConvert(&H2) > &H3B) Then Exit Function
   
    isHour_BlackZX = True
   
End Function

Private Sub Form_Load()
    MsgBox isHour_BlackZX("23:59:9") & vbCrLf & _
           isHour_BlackZX("23:59:9", False)
End Sub



2da version, leyendo 32bits (la anterior es a 16bits pero es mas legible), esta un tanto ofuscada...



Option Explicit

Private Declare Sub RtlMoveMemory Lib "kernel32" (ByVal pDst As Long, ByVal pSrc As Long, ByVal ByteLen As Long)

Public Function addAscToNumber(ByVal lAsc As Long, ByRef rArrConvert() As Long, ByRef lIndex As Long, ByRef lMult As Long) As Long
    addAscToNumber = (-1)
    If (lAsc = &H3A) Then
        lMult = &H1
        lIndex = (lIndex + &H1)
    Else
        If (lAsc = &H0) Then addAscToNumber = &H1: Exit Function
        If ((lAsc > &H39) Or (lAsc < &H30)) Then addAscToNumber = &H0: Exit Function
        rArrConvert(lIndex) = (rArrConvert(lIndex) * lMult) + (lAsc - &H30)
        lMult = (lMult * &HA)
    End If
End Function

'   //  Formato aceptado   HH:MM:SS, H:/MM:S, HH:MM:S, etc!¡.
Public Function isHour_BlackZX(ByRef sStr As String, Optional bExtrictic As Boolean = True) As Boolean
Dim lChar           As Long
Dim lConvert(2)     As Long
Dim lIndex          As Long
Dim lMult           As Long
Dim lStrLnB         As Long
Dim pStr            As Long
Dim pStrLim         As Long
Dim pChar           As Long
    lStrLnB = LenB(sStr)
    If (bExtrictic) Then
        If Not (lStrLnB = &H10) Then Exit Function
    ElseIf (lStrLnB < &H5) And (lStrLnB <= &H8) Then
        Exit Function
    End If
    pStr = StrPtr(sStr)
    pStrLim = (lStrLnB + pStr - &H2)
    pChar = VarPtr(lChar)
    lMult = &H1
    For pStr = pStr To pStrLim Step &H4
        RtlMoveMemory pChar, pStr, &H4  '   //  Cuatro bytes = 4 --> 2 Char...
        Select Case addAscToNumber((lChar And &HFF), lConvert, lIndex, lMult)
            Case (1): Exit For
            Case (0): Exit Function
        End Select
        If (lIndex > &H2) Then Exit Function
        Select Case addAscToNumber(((lChar And &HFF0000) / &H10000), lConvert, lIndex, lMult)
            Case (1): Exit For
            Case (0): Exit Function
        End Select
        If (lIndex > &H2) Then Exit Function
    Next
    If (lConvert(&H0) > &H17) Or (lConvert(&H1) > &H3B) Or (lConvert(&H2) > &H3B) Then Exit Function
    isHour_BlackZX = True
End Function

Private Sub Form_Load()
    MsgBox isHour_BlackZX("23:59:9") & vbCrLf & _
           isHour_BlackZX("23:59:9", False)
End Sub



Output:



Falso
Verdadero



Dulces Lunas!¡.
Título: Re: [Reto] IsHour
Publicado por: Sanlegas en 15 Septiembre 2011, 07:27 AM
@BlackZeroX▓▓▒▒░░: si tienes razon, pero es por que tu función es mas generica... , y claro para resolver un problema puedes usar diferentes soluciones...
Por cierto:
isHour_BlackZX("14:59:09") --- > Fail

Salu2 !
Título: Re: [Reto] IsHour
Publicado por: BlackZeroX en 15 Septiembre 2011, 08:08 AM
Cita de: Tenient101 en 15 Septiembre 2011, 07:27 AM

isHour_BlackZX("14:59:09") --- > Fail


jaja sorry se me ofusco el LenB()...

Código (vb,8) [Seleccionar]


Dim lMult           As Long
Dim pStr            As Long
Dim pChar           As Long

    pStr = LenB(sStr)
    If (bExtrictic) Then
        If Not (pStr = &H8) Then Exit Function
    ElseIf (pStr < &H5) And (pStr <= &H8) Then
        Exit Function
    End If



El valor &H8 deberia ser &H10 ya lo corregi, gracias por el aviso.

Edito:

Valen espacios en blanco? digo para meterle algo para que no diga False en casos como "23:59:59 " y " 23:59:59" o ambos casos " 23:59:59 ".

Dulces Lunas!¡.
Título: Re: [Reto] IsHour
Publicado por: Psyke1 en 15 Septiembre 2011, 11:05 AM
Ui que interesante, se me ocurren muchas formas de hacerlo, podré todas las que se me ocurran, con RegExp sería sencillísimo:
^([01]\d|2[0-3])\:[0-5]\d\:[0-5]\d$
(Después lo desarollo antes de que se me adelante raul338) :silbar: :xD

Mi primera forma de hacerlo (dudo que sea la más rápida, pero igual si la más corta):
Código (vb) [Seleccionar]

Option Explicit

Public Static Function IsHour_Psyke1(ByRef sHour$) As Boolean
On Error Resume Next
    IsHour_Psyke1 = TimeValue(sHour) And (LenB(sHour) = 16)
End Function


Test:
Código (vb) [Seleccionar]
Private Sub Form_Load()
   Debug.Print IsHour_Psyke1("12:13:12")
   Debug.Print IsHour_Psyke1("24:13:12")
End Sub


Resultado:
True
False


DoEvents! :P
Título: Re: [Reto] IsHour
Publicado por: Psyke1 en 15 Septiembre 2011, 12:49 PM
Mi segunda forma de hacerlo (sé que se puede simplificar código con bucles, pero yo lo elijo hacer así  :rolleyes:)


Código (vb) [Seleccionar]

'//En un módulo de clase.

Option Explicit
Private Declare Sub PutMem4 Lib "msvbvm60.dll" (ByVal Ptr&, ByVal Value&)
Private Declare Function VarPtrArray Lib "msvbvm60.dll" Alias "VarPtr" (Ptr() As Any) As Long

Private lngAscHeader&(5), intAsc%()

Public Static Function IsHour_Psyke12(ByRef sHour$) As Boolean
   If LenB(sHour) = 16 Then
       lngAscHeader(3) = StrPtr(sHour)

       '//Check ":"
       If intAsc(2) = 58 And intAsc(5) = 58 Then
           '//Hours
           If intAsc(0) < 48 Or intAsc(0) > 50 Then Exit Function
           
           If intAsc(1) < 48 Then Exit Function
           If intAsc(0) = 50 Then
               If intAsc(1) > 51 Then Exit Function
           Else
               If intAsc(1) > 57 Then Exit Function
           End If
           
           '//Minutes
           If intAsc(3) < 48 Or intAsc(3) > 53 Then Exit Function
           If intAsc(4) < 48 Or intAsc(4) > 57 Then Exit Function
           
           '//Seconds
           If intAsc(6) < 48 Or intAsc(6) > 53 Then Exit Function
           If intAsc(7) < 48 Or intAsc(7) > 57 Then Exit Function
           
           IsHour_Psyke12 = True
       End If
   End If
End Function

Private Sub Class_Initialize()
   lngAscHeader(0) = 1
   lngAscHeader(1) = 2
   lngAscHeader(4) = &H7FFFFFFF
   PutMem4 VarPtrArray(intAsc), VarPtr(lngAscHeader(0))
End Sub

Private Sub Class_Terminate()
   PutMem4 VarPtrArray(intAsc), 0
End Sub


Test:
Código (vb) [Seleccionar]
Option Explicit

Private Sub Form_Load()
Dim c As New Class1

   Debug.Print String$(50, "=")
   Debug.Print c.IsHour_Psyke12(Time$)      'True
   Debug.Print c.IsHour_Psyke12("23:59:59") 'True
   Debug.Print c.IsHour_Psyke12("00:00:00") 'True
   Debug.Print c.IsHour_Psyke12("34:54:13") 'False
   Debug.Print c.IsHour_Psyke12("14:64:24") 'False
   Debug.Print c.IsHour_Psyke12("22:07:70") 'False
   
Set c = Nothing
End Sub


Resultados:
==================================================
True
True
True
False
False
False




EDIT:

Mi tercera forma de hacerlo (no creo que sea muy rápida, tan solo doy más opciones...  ;) ):
Código (vb) [Seleccionar]

'//En un módulo de clase.

Option Explicit
Private oRegExp As Object

Public Static Function IsHour_Psyke13(ByRef sHour$) As Boolean
   IsHour_Psyke13 = oRegExp.Test(sHour)
End Function

Private Sub Class_Initialize()
   Set oRegExp = CreateObject("VBScript.RegExp")
   With oRegExp
       .Pattern = "^([01]\d|2[0-3])\:[0-5]\d\:[0-5]\d$"
       .Global = True
   End With
End Sub

Private Sub Class_Terminate()
   Set oRegExp = Nothing
End Sub


Código (vb) [Seleccionar]
Option Explicit

Private Sub Form_Load()
Dim c As New Class1

   Debug.Print String$(50, "=")
   Debug.Print c.IsHour_Psyke13(Time$)      'True
   Debug.Print c.IsHour_Psyke13("23:59:59") 'True
   Debug.Print c.IsHour_Psyke13("00:00:00") 'True
   Debug.Print c.IsHour_Psyke13("34:54:13") 'False
   Debug.Print c.IsHour_Psyke13("14:64:24") 'False
   Debug.Print c.IsHour_Psyke13("22:07:70") 'False
   
Set c = Nothing
End Sub


Resultados:
==================================================
True
True
True
False
False
False




EDIT2:

Mi cuarta forma de hacerlo:
Código (vb) [Seleccionar]

Option Explicit

Public Static Function IsHour_Psyke14(ByRef sHour$) As Boolean
Dim h As Byte, m As Byte, s As Byte
On Error GoTo NoHour:
   If LenB(sHour) = 16 Then
       If InStrB(1, ":", MidB$(sHour, 5, 2), vbBinaryCompare) = 0 Then Exit Function
       If InStrB(1, ":", MidB$(sHour, 11, 2), vbBinaryCompare) = 0 Then Exit Function
       
       h = LeftB$(sHour, 4) + 0
       If h > 23 Then Exit Function
       m = MidB$(sHour, 7, 4) + 0
       If m > 59 Then Exit Function
       s = RightB$(sHour, 4) + 0
       If s > 59 Then Exit Function
       
       IsHour_Psyke14 = True
   End If
   Exit Function
NoHour:
End Function


Test:
Código (vb) [Seleccionar]
Option Explicit

Private Sub Form_Load()
   Debug.Print String$(50, "=")
   Debug.Print IsHour_Psyke14(Time$)      'True
   Debug.Print IsHour_Psyke14("23:59:59") 'True
   Debug.Print IsHour_Psyke14("00:00:00") 'True
   Debug.Print IsHour_Psyke14("34:54:13") 'False
   Debug.Print IsHour_Psyke14("14:64:24") 'False
   Debug.Print IsHour_Psyke14("22:04:70") 'False
End Sub


Resultados:
==================================================
True
True
True
False
False
False


PD: Lo próximo que tenga que decir haré un comentario nuevo que sino hago una pág kilométrica. :-X :laugh:

DoEvents! :P
Título: Re: [Reto] IsHour
Publicado por: raul338 en 15 Septiembre 2011, 15:02 PM
Buena idea con el reto :D yo me olvide que iba a proponer de reto y después se me paso :xD

Hice lo mismo que BlackZeroX, agarre mi IsDate y lo transforme a IsHour!! :xD
Ademas de que lo optimize (y puedo optimizar tambien el IsDate, pero ya fue xD)
Código (vb) [Seleccionar]

Public Function IsHour_r338(str As String) As Boolean
If str = vbNullString Then Exit Function
If LenB(str) <> 16 Then Exit Function
   
    Dim j As Long, k As Long, vTemp As Byte, jp As Long
    Dim strp As Long
    strp = StrPtr(str)
    jp = VarPtr(j)
    For k = 0 To 14 Step 2
        Call RtlMoveMemory(jp, strp + k, 1)
        Select Case k
            Case 0
                If j < 48 And j > 50 Then Exit Function
                vTemp = (j - 48) * 10
            Case 2
                If j < 48 And j > 57 Then Exit Function
                vTemp = vTemp + (j - 48)
                If vTemp > 23 Then Exit Function
            Case 4, 10: If j <> 58 Then Exit Function
            Case 6, 12
                If j < 48 And j > 53 Then Exit Function
                vTemp = (j - 48) * 10
            Case 8, 14
                If j < 48 And j > 57 Then Exit Function
                vTemp = vTemp + (j - 48)
                If vTemp > 59 Then Exit Function
        End Select
    Next
    IsHour_r338 = True
End Function
Título: Re: [Reto] IsHour
Publicado por: BlackZeroX en 15 Septiembre 2011, 19:53 PM
.
No me agradan los BadTypeConvert/EvilTypeConvert que hace Psyke1 aun que en fin de cuentas funciona pero no me agradan...  :¬¬

Dulces Lunas!¡.
Título: Re: [Reto] IsHour
Publicado por: Psyke1 en 15 Septiembre 2011, 22:37 PM
¿Ahora mejor? :xD :-*

DoEvents! :P
Título: Re: [Reto] IsHour
Publicado por: raul338 en 15 Septiembre 2011, 23:40 PM
Usando el mismo estilo de prueba que use en IsDate :rolleyes:

=== Reto IsHour ====
09-15-2011 18:41:27

Testeo de calidad
==============================
00:00:00 Psyke1 FAILS

Testeo de falsos
==============================
5:59:59 Psyke1 FAILS


Testeo de velocidades
==============================
300000 vueltas

413,168 msec BlackZeroX
1.198,057 msec Psyke1
572,217 msec Psyke14
215,601 msec raul338
Título: Re: [Reto] IsHour
Publicado por: BlackZeroX en 15 Septiembre 2011, 23:47 PM
Cita de: Psyke1 en 15 Septiembre 2011, 22:37 PM
¿Ahora mejor? :xD :-*

Sigue igual... ya que para sumar un numero a un valor guardado en una string se recurre al BadTypeConvert/EvilTypeConvert, lo digo solo por que a simple vista un "Novato/Intermedio" puede confundirse un poco y por eso no me gusta, no se digiere rapido, aun asi genial funcion!¡.

P.D.:
    Sigues en CrazedCountryRebels?, estuve en españa hace 1 mes (vacaciones) y busque ese restaurante o lo que sea no lo haye jajaja... si era españa vdd?

Dulces Lunas!¡.
Título: Re: [Reto] IsHour
Publicado por: Psyke1 en 16 Septiembre 2011, 00:43 AM
@BlackZero
Ahh, ok, te lo había copiado de un código tuyo de no sé donde... :silbar:
Viniste a España y no me avisas. :-( :xD
Sí, sigo en el grupo, sé que no es muy metal para ti, pero bueno... :laugh: ;)

@raul
Gracias, corregida... :)
Que listo, justo pruebas con mis funciones lentas... :rolleyes:
Si probamos con mi función más rápida IsHour_Psyke12 las cosas cambian. :silbar:


Option Explicit

Private Declare Sub RtlMoveMemory Lib "kernel32" (ByVal pDst As Long, ByVal pSrc As Long, ByVal ByteLen As Long)
Private Declare Sub Sleep Lib "kernel32" (ByVal dwMilliseconds As Long)

Private Sub Form_Load()
Dim t As New CTiming, c As New Class1, i&, r&, a$(), b As Boolean

   Me.AutoRedraw = True
   a() = Split("34:23:45 5:59:59 10:45:67 raulfeo 00:00:00 14:57:79 111:23:4", " ")
   
   t.Reset
   For i = 0 To 200000
       For r = 0 To 6
           b = IsHour_r338(a(r))
       Next
   Next
   Me.Print t.sElapsed, "raul338"
   Sleep 1000
   
   t.Reset
   For i = 0 To 200000
       For r = 0 To 6
           b = isHour_BlackZX(a(r))
       Next
   Next
   Me.Print t.sElapsed, "Black"
   Sleep 1000
   
   t.Reset
   For i = 0 To 200000
       For r = 0 To 6
           b = c.IsHour_Psyke12(a(r))
       Next
   Next
   Me.Print t.sElapsed, , "Psyke13"

   Set c = Nothing
   Set t = Nothing
End Sub


Resultado:
(http://img27.imageshack.us/img27/5811/carreteraeneldesierto10.jpg)

DoEvents! :P

Título: Re: [Reto] IsHour
Publicado por: BlackZeroX en 16 Septiembre 2011, 01:28 AM
@ A mi criterio ni la de Raul338 ni la mia son legiles (me tarde un poco en entender la de Raul338, mas que nada como comprobaba los rangos, ya que esta dispersa esa region)... y la mia esta un poco ofuscada... mas aun sin comentarios, almenos que seas yo  :xD.

Para mi la funcion mas rapida y legible es la de IsHour_Psyke12, no tengo que comprobarla para saber eso.

Dulces Lunas!¡.
Título: Re: [Reto] IsHour
Publicado por: Elemental Code en 16 Septiembre 2011, 03:30 AM
Rustic Mode ON!

[Rustic]

Código (vb) [Seleccionar]
Public Function eCode(ByRef Time As String) As Boolean
    On Error GoTo Fallo
    If Len(Time) <> 8 Then Exit Function
    Dim sTime() As String
    sTime = Split(Time, ":")
    If CLng(sTime(0)) >= 0 And CLng(sTime(0)) <= 23 And _
       CLng(sTime(1)) >= 0 And CLng(sTime(1)) <= 59 And _
       CLng(sTime(2)) >= 0 And CLng(sTime(2)) <= 59 Then eCode = True
Fallo:
End Function


[/Rustic]
Título: Re: [Reto] IsHour
Publicado por: Sanlegas en 18 Septiembre 2011, 00:02 AM
Bueno aqui el mio...  ;D

Código (vb) [Seleccionar]
Public Function IsHour(ByRef Expresion As String) As Boolean
Dim C()         As Byte
Dim L           As Integer
Dim P           As Integer
Dim F           As Boolean

L = Len(Expresion)
If (L And &H8) Then
    L = (L - &H8)
    If (L Or &H0) = &H0 Then
        C = StrConv(Expresion, vbFromUnicode)
        P = &H2
Sig0:
        L = C(P)
        If (L And &H20) Then
            L = (L - &H20)
            If (L And &H10) Then
                L = (L - &H10)
                If (L And &H8) Then
                    L = (L - &H8)
                    If (L And &H2) Then
                        L = (L - &H2)
                        If (L Or &H0) = &H0 Then
                            If (P And &H4) Then
                                GoTo Sig
                            Else
                                P = &H5
                                GoTo Sig0
                            End If
                        End If
                    End If
                End If
            End If
        End If
        Exit Function
Sig:
        L = C(0)
        L = (L - &H33)
        If (L And &H40) Then
            L = (C(0) - &H30)
            If (L And &H40) Then
                Exit Function
            Else
                If (L And &H2) Then F = True
                GoTo Sig2
            End If
        End If
        Exit Function
Sig2:
        L = C(1)
        L = (L - &H3A)
        If (L And &H40) Then
            L = (-&HB - L)
            If (L And &H10) Then
                L = ((Not L) - &H4)
                If (L And &H4) Then
                    GoTo Sig3
                Else
                    If Not F Then GoTo Sig3
                End If
            End If
        End If
        Exit Function
Sig3:
        P = &H3
Sig4:
        L = C(P)
        L = (L - &H36)
        If (L And &H40) Then
            L = (-L - &H7)
            If (L And &H8) Then
                P = (P + &H3)
                If (P And &H8) Then
                    P = &H4
                    GoTo Sig5
                Else
                    GoTo Sig4
                End If
            End If
        End If
        Exit Function
Sig5:
        L = C(P)
        L = (L - &H3A)
        If (L And &H40) Then
            L = (-L - &HB)
            If (L And &H10) Then
                P = (P + &H3)
                If (P And &H8) Then IsHour = True Else GoTo Sig5
            End If
        End If
    End If
End If
End Function


Alguien puede subir el proyecto completo del reto?, salu2 !
Título: Re: [Reto] IsHour
Publicado por: BlackZeroX en 18 Septiembre 2011, 02:57 AM
Cita de: Psyke1 en 16 Septiembre 2011, 00:43 AM
@BlackZero
Ahh, ok, te lo había copiado de un código tuyo de no sé donde... :silbar:

lo se pero yo lo hacia de la manera (Solo en/para numeros).

TipoNumerico1 = (TipoNumerico1.2 + TipoNumerico2)

Donde: TipoNumerico1.2 es del mismo tipo que TipoNumerico1 pero con valor 0... y el tipo resultante sera del tipo TipoNumerico1.2, mas no del TipoNumerico2...

ej.:

Código (vb) [Seleccionar]


dim lVal as long
dim bVal as byte

lval = (&H0 + bVal)



y tu lo haces de una manera un poco mas ofuscada... ya que como sabras si pones

Código (vb) [Seleccionar]


dim lVal as long
Const VAL as string = "10"

VAL
lval = (&H0 + VAL) ' // mas no (VAL + &H0)



Realizara su trabajo, pero le das mas trabajo independiente a el lenguaje y sabra solo el que resultados salgan... ya que como sabras "10" se deberia transformar a un valor de tipo numerico (Lo que yo hago en mi codigo y que seguro Raul338 me copio..  :xD :xD na no te creas es un gran programador  ;) :))