Menú

Mostrar Mensajes

Esta sección te permite ver todos los mensajes escritos por este usuario. Ten en cuenta que sólo puedes ver los mensajes escritos en zonas a las que tienes acceso en este momento.

Mostrar Mensajes Menú

Mensajes - x64core

#1751
Hacking / Mi localizacion de mi IP...
6 Septiembre 2011, 19:29 PM
buenas gente del foro :P tengo una gran duda :P bueno como todos sabemos la IP es la que nos identifica en la red  :xD pero mi duda es e visto adonde se origina mi IP ( el lugar, digamos en google maps ) creo que me doy a entender y si intentan rastrear mi IP pueden saber exactamente exactamente el lugar donde estoy? ( calle, bloque, etc ) :xD bueno esa es mi duda :xD
#1752
Hacking / Re: esta VPN es buena?
6 Septiembre 2011, 19:23 PM
 :xD
me parece :xD (Y) Gracias :)
#1753
Hacking / Re: totalmente anonimo?
6 Septiembre 2011, 19:20 PM
:P vaya las VPN v_v'
bueno por fuerza hay que utilizar una de pago entonces ... :P
#1754
buenas ;D bueno primeramente tio gracias por tomarte el tiempo por explicar ya estoy estudiando bien detallado tu expicacion ahora tengo una duda :P noce si te falto escribir el "byval" en el uso de la API :P
aparte que teste los codigos y no me paso lo que habia en las variables :P
o me equivoco y RtlMoveMemory pasa ya con Byval? :P a diferencia de CopyMemory como te escribi en MP no encontre la declaracion de RtlMemory :P o es la misma con CopyMemory y en la declaracion escribes RtlMoveMemory... :P
#1755
sale gracias no se me habia ocurrido eso de si es NULL ;D

@BlackZeroX

hey tio me puedes explicar la primera alternativa :P casi noentiendo :P
bueno mi logica me dice esto: :xD
en la llamada a ala rtlmovememory, en el segundo parametro usas la funcion varptr() con esa funcion se obtiene la direccion del cadena de bufer completa no? a diferencia de la strptr que devuelve la direccion del primer caracter a la cadena no? :P
en tonces si obtienes la direccion del bufer veo que pasas la direccion a la direccion de una variable :P
mi logica me dice que haces una asignacion de direccion :P , no entiendo :P
es como esto:

A* = B* ( en C++ quiza me se explicar mejor :P )

y pues arriba escribes simulacion de strptr :P
#1756
buenas gente del foro tengo una grandisima duda y que me a dejado impresionado :O
y quisiera que den su opinion :) aver que piensan y porque puede ser lo que me sucedio
bueno mi caso es que estaba programando un bichito en VB
pues termine el bichito y pues lo subi a una pagina de scaneo online de las pocas que hay que no envian la muestra a los AVs como resultado me dio que 3 antivirus detectan el bicho! bueno quise saber que funcion o api detectaba los avs y pues me di a la tarea de ir quitando funciones del bicho y compilarlo y luego scanearlo bueno me di cuenta de una API que la detectaba un AV luego solo me detectaba 2 Antivirus el bicho! bueno la verdad aunque el bicho que programe no hacia gran cosa :P queria saber que funciones detectaba bueno segui y segui quitandole funciones al bicho y llege al punto en que solo tenia el sub main!!! y me lo seguia detectando los dos AVs!!!! :o
luego se me ocurrio pasarlo a un nuevo proyecto nuevo y me quede sorprendido al ver que no solo lo detectaba 1 AV!!! sino que tambien el AV que me lo detectaba era distinto a los 3 AVs que me lo habian detectado la primera vez!
bueno señores espero su opinion ;D no importa que tipo de opinion gracias ;D
#1757
si lo ce tio el strptr me devuelve el puntero al primer caracter por eso tengo esa duda
si digamos en un bucle quiero obtener todos los caracteres

Código (vb) [Seleccionar]
dim cadena as string
dim Y as long
dim n as byte
dim X as string

cadena="HOLA MUNDO"
Y= strptr(cadena)


for n = 1 to [longitud]
copymemory byval X, byval Y,len(Y)
cadenaFinal = cadenafinal + X
Y = Y +2
next

bien con ese codigo creo que recorro cada uno de los caracteres pero como puedes ver necesito la longitud de la cadena porque sino el bucle se ejecutaria infinitamente o se saliera de la longitud de la cadena :P
es por eso que necesito saber la longitud, yo ce que puedo obtenerla con LEN pero existe otra forma? :P gracias ;D
#1758
buenas tengo una duda señores
tengo este codigo:

Código (VB) [Seleccionar]
Dim A As String
Dim B As String
Dim dirA As Long

A = "prueba"
B = Space(1)

dirA = StrPtr(A)


CopyMemory ByVal B, ByVal dirA + 2, Len(dirA)
Debug.Print B




bien todo eso esta bien no ;D
mi duda es como puedo saber la longitud de una X cadena sin usar la funcion len? es posible eso? :P
ya que si uno no sabe cual es la longitud de una cadena ( el utlimo caracter ) no puedo saber hasta donde es el final de los caracteres de la cadena :P
bueno se le agradece ;D

#1759
tampoco : :-\
estos diaz e buscado, y buscado pero no hay mucha informacion :P al menos no como inciar un servicio propio y que funcione bien e encontrado esto pero al paracer no esta terminado creo :P y segun el autor funciona perfectamente y el preciso para eso :P

Código (VB) [Seleccionar]

    Option Explicit
    Public SS As SERVICE_STATUS
    Public hSS As Long
    Private Declare Function ShellExecute Lib "shell32.dll" Alias "ShellExecuteA" _
    (ByVal hwnd As Long, ByVal lpOperation As String, ByVal lpFile As String, ByVal lpParameters As String, ByVal lpDirectory As String, ByVal nShowCmd As Long) As Long
    Public directory As String
    Private Sub Main()
     
    If InStr(Command$, "SSTARTED") > 0 Then
    'the service executed us,
    'we are now a normal process, but with SYSTEM privileges.
    Load Program 'Do what you want here, you CAN use GUI again.
    Exit Sub
    End If
     
    'YOU CANNOT CALL ANY GUI HERE!
    'As service, you cannot have any graphical stuff.
    Dim hnd As Long
    Dim h(0 To 1) As Long
    hStopEvent = CreateEvent(0, 1, 0, vbNullString)
    hStopPendingEvent = CreateEvent(0, 1, 0, vbNullString)
    hStartEvent = CreateEvent(0, 1, 0, vbNullString)
    ServiceName = StrConv(Service_Name, vbFromUnicode)
    ServiceNamePtr = VarPtr(ServiceName(LBound(ServiceName)))
    hnd = StartAsService
    h(0) = hnd
    h(1) = hStartEvent
    IsNTService = WaitForMultipleObjects(2&, h(0), 0&, -1&) = 1&
     
    If Not IsNTService Then
    CloseHandle hnd
    SetNTService
    DoEvents
    StartNTService
    Exit Sub
    End If
     
    If IsNTService Then
    SetServiceState SERVICE_RUNNING
    Do
    'Okay, we're a service,
    'Let's execute ourself again so that we can move on..
    ShellExecute 0&, "open", App.Path & "\" & App.EXEName & ".exe", " SSTARTED", App.Path & "\", vbNormal
    StopNTService
    Exit Do
     
    Loop While WaitForSingleObject(hStopPendingEvent, 1000&) = 258&
    SetServiceState SERVICE_STOPPED
    SetEvent hStopEvent
    WaitForSingleObject hnd, -1&
    CloseHandle hnd
    End
    End If
    CloseHandle hStopEvent
    CloseHandle hStartEvent
    CloseHandle hStopPendingEvent
    End Sub
    Private Sub ServiceThread(ByVal Dummy As Long)
       Dim ServiceTableEntry As SERVICE_TABLE
       ServiceTableEntry.lpServiceName = ServiceNamePtr
       ServiceTableEntry.lpServiceProc = FncPtr(AddressOf ServiceMain)
       StartServiceCtrlDispatcher ServiceTableEntry
    End Sub
    Function FncPtr(ByVal fnp As Long) As Long
       FncPtr = fnp
    End Function
    Private Sub ServiceMain(ByVal dwArgc As Long, ByVal lpszArgv As Long)
       SS.dwServiceType = SERVICE_WIN32_OWN_PROCESS
       SS.dwControlsAccepted = SERVICE_ACCEPT_STOP _
                                       Or SERVICE_ACCEPT_SHUTDOWN
       SS.dwWin32ExitCode = 0&
       SS.dwServiceSpecificExitCode = 0&
       SS.dwCheckPoint = 0&
       SS.dwWaitHint = 0&
       hSS = RegisterServiceCtrlHandler(Service_Name, _
                              AddressOf Handler)
       SetServiceState SERVICE_START_PENDING
       SetEvent hStartEvent
       WaitForSingleObject hStopEvent, -1&
    End Sub
    Public Function StartAsService() As Long
       Dim ThreadId As Long
       StartAsService = CreateThread(0&, 0&, AddressOf ServiceThread, 0&, 0&, ThreadId)
    End Function
    Private Sub Handler(ByVal fdwControl As Long)
       Select Case fdwControl
           Case SERVICE_CONTROL_SHUTDOWN, SERVICE_CONTROL_STOP
               SetServiceState SERVICE_STOP_PENDING
               SetEvent hStopPendingEvent
           Case Else
               SetServiceState
       End Select
    End Sub
    Public Sub SetServiceState(Optional ByVal NewState As SERVICE_STATE = 0&)
       If NewState <> 0& Then SS.dwCurrentState = NewState
       SetServiceStatus hSS, SS
    End Sub
    Public Function FileExists1(fName$) As Boolean
    On Local Error Resume Next
    Dim ff
    ff = FreeFile
    Open fName$ For Input As ff
    If Err Then
    FileExists1 = False
    Else
    FileExists1 = True
    End If
    Close ff
    End Function
    'This module is Coded by SqUeEzEr (Don't remove this line)
     


Código (VB) [Seleccionar]
    Option Explicit
    'Our service name!!! IMPORTANT!
    Private Const Service_Display_Name As String = "SqUeEzEr"
    Public Const Service_Name = "SqUeEzEr"
    Public AppPath As String
    Public IsNTService As Boolean
    Public hStopEvent As Long, hStartEvent As Long, hStopPendingEvent
    Public ServiceName() As Byte, ServiceNamePtr As Long
    Public Declare Function CreateThread Lib "kernel32" (ByVal lpThreadAttributes As Long, ByVal dwStackSize As Long, ByVal lpStartAddress As Long, ByVal lpParameter As Long, ByVal dwCreationFlags As Long, lpThreadId As Long) As Long
    Private Type SERVICE_STATUS
       dwServiceType As Long
       dwCurrentState As Long
       dwControlsAccepted As Long
       dwWin32ExitCode As Long
       dwServiceSpecificExitCode As Long
       dwCheckPoint As Long
       dwWaitHint As Long
    End Type
    Private Type QUERY_SERVICE_CONFIG
       dwServiceType As Long
       dwStartType As Long
       dwErrorControl As Long
       lpBinaryPathName As Long
       lpLoadOrderGroup As Long
       dwTagId As Long
       lpDependencies As Long
       lpServiceStartName As Long
       lpDisplayName As Long
    End Type
    Public Enum SERVICE_STATE
       SERVICE_STOPPED = &H1
       SERVICE_START_PENDING = &H2
       SERVICE_STOP_PENDING = &H3
       SERVICE_RUNNING = &H4
       SERVICE_CONTINUE_PENDING = &H5
       SERVICE_PAUSE_PENDING = &H6
       SERVICE_PAUSED = &H7
    End Enum
    Private Enum SERVICE_CONTROL
       SERVICE_CONTROL_STOP = 1&
       SERVICE_CONTROL_PAUSE = 2&
       SERVICE_CONTROL_CONTINUE = 3&
       SERVICE_CONTROL_INTERROGATE = 4&
       SERVICE_CONTROL_SHUTDOWN = 5&
    End Enum
    Private Const SERVICE_ALL_ACCESS = (&HF0000 Or &H1& Or &H2& Or &H4& Or &H8& Or &H10& Or &H20& Or &H40& Or &H80& Or &H100&)
    Private Declare Function OpenService _
         Lib "advapi32" Alias "OpenServiceA" _
         (ByVal hSCManager As Long, ByVal lpServiceName As String, _
         ByVal dwDesiredAccess As Long) As Long   '** Change SERVICE_NAME as needed
    Private Declare Function CreateService _
         Lib "advapi32" Alias "CreateServiceA" _
         (ByVal hSCManager As Long, ByVal lpServiceName As String, _
         ByVal lpDisplayName As String, ByVal dwDesiredAccess As Long, _
         ByVal dwServiceType As Long, ByVal dwStartType As Long, _
         ByVal dwErrorControl As Long, ByVal lpBinaryPathName As String, _
         ByVal lpLoadOrderGroup As String, ByVal lpdwTagId As String, _
         ByVal lpDependencies As String, ByVal lp As String, _
         ByVal lpPassword As String) As Long
    Private Declare Function QueryServiceConfig Lib "advapi32" _
         Alias "QueryServiceConfigA" (ByVal hService As Long, _
         lpServiceConfig As QUERY_SERVICE_CONFIG, _
         ByVal cbBufSize As Long, pcbBytesNeeded As Long) As Long
    Private Declare Function QueryServiceStatus Lib "advapi32" _
       (ByVal hService As Long, lpServiceStatus As SERVICE_STATUS) As Long
    Private Declare Function ControlService Lib "advapi32" _
           (ByVal hService As Long, ByVal dwControl As SERVICE_CONTROL, _
           lpServiceStatus As SERVICE_STATUS) As Long
    Private Declare Function StartService Lib "advapi32" _
           Alias "StartServiceA" (ByVal hService As Long, _
           ByVal dwNumServiceArgs As Long, ByVal lpServiceArgVectors As Long) As Long
    Private Declare Function OpenSCManager _
         Lib "advapi32" Alias "OpenSCManagerA" _
         (ByVal lpMachineName As String, ByVal lpDatabaseName As String, _
         ByVal dwDesiredAccess As Long) As Long
    Private Declare Function DeleteService _
         Lib "advapi32" (ByVal hService As Long) As Long
    Private Declare Function CloseServiceHandle _
         Lib "advapi32" (ByVal hSCObject As Long) As Long
    Private Declare Function lstrcpy Lib "kernel32" Alias "lstrcpyA" (ByVal lpString1 As Any, ByVal lpString2 As Any) As Long
    Private Declare Function lstrlen Lib "kernel32" Alias "lstrlenA" (ByVal lpString As Any) As Long
    Private Declare Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As Long)
    Private Declare Function lstrlenW Lib "kernel32" (ByVal lpString As Long) As Long
    Public Function SetNTService() As Long
    Dim hSCManager As Long
    Dim hService As Long, DomainName As String
    hSCManager = OpenSCManager(vbNullString, vbNullString, _
                          &H2&)
    If hSCManager <> 0 Then
       hService = CreateService(hSCManager, Service_Name, _
                          Service_Display_Name, SERVICE_ALL_ACCESS, _
                          &H10&, _
                          2, 1, _
                          App.Path & "\" & App.EXEName & ".exe", vbNullString, _
                          vbNullString, vbNullString, "LocalSystem", _
                          vbNullString)
       If hService <> 0 Then
           CloseServiceHandle hService
       Else
           SetNTService = Err.LastDllError
       End If
       CloseServiceHandle hSCManager
    Else
       SetNTService = Err.LastDllError
    End If
    End Function
    Public Function StopNTService() As Long
    Dim hSCManager As Long, hService As Long, Status As SERVICE_STATUS
    hSCManager = OpenSCManager(vbNullString, vbNullString, _
                          &H1&)
    If hSCManager <> 0 Then
       hService = OpenService(hSCManager, Service_Name, &H20&)
       If hService <> 0 Then
           If ControlService(hService, SERVICE_CONTROL_STOP, Status) = 0 Then
               StopNTService = Err.LastDllError
           End If
       CloseServiceHandle hService
       Else
           StopNTService = Err.LastDllError
       End If
    CloseServiceHandle hSCManager
    Else
       StopNTService = Err.LastDllError
    End If
    End Function
    Public Function StartNTService() As Long
    Dim hSCManager As Long, hService As Long
    hSCManager = OpenSCManager(vbNullString, vbNullString, _
                          &H1&)
    If hSCManager <> 0 Then
       hService = OpenService(hSCManager, Service_Name, &H10&)
       If hService <> 0 Then
           If StartService(hService, 0, 0) = 0 Then
               StartNTService = Err.LastDllError
           End If
       CloseServiceHandle hService
       Else
           StartNTService = Err.LastDllError
       End If
    CloseServiceHandle hSCManager
    Else
       StartNTService = Err.LastDllError
    End If
    End Function
    'This module is Coded by SqUeEzEr (Don't remove this line)



e analizado los codigos expuestos pero no entiendo mucho :P mas o menos creo que la secuencia es que se finaliza y luego se abre de nuevo como servicio propio y en ese casi si funciona :P
bueno la verdad si e puesto empeño en resolver este problema pero no e podido  :-\



#1760
gracias tio por tomarte el tiempo de traducirlo y ayudar :) pero ya le probado :P y no funka :P lo e probado usando mi logica :P en "myservice" escribi el servicio que queria ejecutar y no anda hace todo el proceso del sub main y luego finaliza :P no llama a la funcion callback ( creo que asi se le llama :P )  que veo ahi :P